Skip to content
Snippets Groups Projects
  1. Dec 01, 2016
    • Matthias Klose's avatar
      configure.ac: Don't use pkg-config to check for bdw-gc. · 825fba52
      Matthias Klose authored
      <toplevel>
      
              * configure.ac: Don't use pkg-config to check for bdw-gc.
              * configure: Regenerate.
      
      config/
      
              * pkg.m4: Remove.
      
      libobjc/
      
              * configure.ac: Don't use pkg-config to check for bdw-gc.
              * configure: Regenerate.
      
      gcc/
      
              * doc/install.texi: Don't use pkg-config to check for bdw-gc.
      
      From-SVN: r243108
      825fba52
    • Richard Biener's avatar
      tree-ssa-alias.c (indirect_refs_may_alias_p): Do not treat arrays with same... · a41e62e7
      Richard Biener authored
      tree-ssa-alias.c (indirect_refs_may_alias_p): Do not treat arrays with same type as objects that cannot overlap.
      
      2016-12-01  Richard Biener  <rguenther@suse.de>
      
      	* tree-ssa-alias.c (indirect_refs_may_alias_p): Do not
      	treat arrays with same type as objects that cannot overlap.
      
      	* gcc.dg/torture/alias-2.c: New testcase.
      
      From-SVN: r243107
      a41e62e7
    • Richard Biener's avatar
      tree-ssa-alias.c (indirect_refs_may_alias_p): Do not treat arrays with same... · a1fc386a
      Richard Biener authored
      tree-ssa-alias.c (indirect_refs_may_alias_p): Do not treat arrays with same type as objects that cannot overlap.
      
      2016-12-01  Richard Biener  <rguenther@suse.de>
      
      	* tree-ssa-alias.c (indirect_refs_may_alias_p): Do not
      	treat arrays with same type as objects that cannot overlap.
      
      	* gcc.dg/torture/alias-2.c: New testcase.
      
      From-SVN: r243106
      a1fc386a
    • Georg-Johann Lay's avatar
      tiny-memx.c: Only perform if target avr_tiny. · b0da9709
      Georg-Johann Lay authored
      gcc/testsuite/
      	* gcc.target/avr/tiny-memx.c: Only perform if target avr_tiny.
      	* gcc.target/avr/tiny-caller-save.c: Dito.
      
      From-SVN: r243105
      b0da9709
    • Georg-Johann Lay's avatar
      avr.c (avr_print_operand): Use SYMBOL_REF_P if possible. · 1636ebdc
      Georg-Johann Lay authored
      gcc/
      	* config/avr/avr.c (avr_print_operand): Use SYMBOL_REF_P if possible.
      	(avr_handle_addr_attribute, avr_asm_output_aligned_decl_common)
      	(avr_asm_asm_output_aligned_bss, avr_addr_space_convert): Dito.
      
      From-SVN: r243104
      1636ebdc
    • Andre Vehreschild's avatar
      coarray_lib_alloc_4.f90: Fix for 32-bits. · ccbf6355
      Andre Vehreschild authored
      gcc/testsuite/ChangeLog:
      
      2016-12-01  Andre Vehreschild  <vehre@gcc.gnu.org>
      
      	* gfortran.dg/coarray_lib_alloc_4.f90: Fix for 32-bits.
      
      From-SVN: r243101
      ccbf6355
    • Jakub Jelinek's avatar
      re PR debug/78587 (dwarf2out.c:1517:45: runtime error: negation of... · d26b3eb7
      Jakub Jelinek authored
      re PR debug/78587 (dwarf2out.c:1517:45: runtime error: negation of -9223372036854775808 cannot be represented in type 'long int [4]'; cast to an unsigned type to negate this value to itself)
      
      	PR debug/78587
      	* dwarf2out.c (loc_descr_plus_const): For negative offset use
      	uint_loc_descriptor instead of int_loc_descriptor and perform negation
      	in unsigned HOST_WIDE_INT type.
      	(scompare_loc_descriptor): Shift UINTVAL left instead of INTVAL.
      
      	* gcc.dg/debug/pr78587.c: New test.
      
      From-SVN: r243100
      d26b3eb7
    • Jakub Jelinek's avatar
      re PR target/78614 (ICE error: invalid rtl sharing found in the insn... · 43d0b501
      Jakub Jelinek authored
      re PR target/78614 (ICE error: invalid rtl sharing found in the insn (verify_rtx_sharing) gcc/emit-rtl.c:2743)
      
      	PR target/78614
      	* config/rs6000/rs6000.c (rs6000_frame_related): Call
      	set_used_flags (pat) before any simplifications.  Clear used flag on
      	PARALLEL copy.  Don't guard add_reg_note call.  Call
      	copy_rtx_if_shared on pat before storing it into
      	REG_FRAME_RELATED_EXPR.
      
      From-SVN: r243099
      43d0b501
    • Ville Voutilainen's avatar
      The convertible_to traits need to use a variadic catch-all for the false-cases. · d9b2d86c
      Ville Voutilainen authored
      The convertible_to traits need to use a variadic catch-all for the
      false-cases.
      * include/std/istream (__is_convertible_to_basic_istream):
      Change the parameter of the false-case of __check to a variadic.
      * include/std/ostream (__is_convertible_to_basic_ostream):
      Likewise.
      
      From-SVN: r243098
      d9b2d86c
    • Alan Modra's avatar
      [RS6000] fix rtl-checking internal compiler error · f73ee211
      Alan Modra authored
      	* gcc/config/rs6000/rs6000.c (insn_is_swappable_p): Properly
      	look inside UNSPEC_VSX_XXSPLTW vec.
      
      From-SVN: r243097
      f73ee211
    • Bernd Edlinger's avatar
      crossconfig.m4 (*-linux*): Add link-check for memalign. · 77e6870d
      Bernd Edlinger authored
      2016-12-01  Bernd Edlinger  <bernd.edlinger@hotmail.de>
      
              * crossconfig.m4 (*-linux*): Add link-check for memalign.
              * configure: Regenerated.
      
      From-SVN: r243095
      77e6870d
    • Ian Lance Taylor's avatar
      runtime: set isarchive in initsig · 6e7f1be7
      Ian Lance Taylor authored
          
          The library initialization code in go-libmain.c sets the C variable
          runtime_isarchive but failed to set the Go variable runtime.isarchive.
          We don't currently have a way to let C code access an unexported Go
          variable, but fortunately the only time the Go function initsig is
          called with an argument of true is exactly where we want to set
          isarchive.  So let initsig do it.
          
          Reviewed-on: https://go-review.googlesource.com/33753
      
      From-SVN: r243094
      6e7f1be7
    • Tim Shen's avatar
      re PR libstdc++/71500 (regex::icase only works on first character in a range) · 974afa58
      Tim Shen authored
      	PR libstdc++/71500
      	* include/bits/regex.h (basic_regex::basic_regex): Use ECMAScript
      	when the syntax is not specified.
      	* include/bits/regex_compiler.h (_RegexTranslator,
      	_RegexTranslatorBase): Partially support icase in ranges.
      	* include/bits/regex_compiler.tcc (_BracketMatcher::_M_apply):
      	Refactor _M_apply to make the control flow easier to follow, and
      	call _M_translator._M_match_range as added previously.
      	* testsuite/28_regex/traits/char/icase.cc: Add new tests.
      	* testsuite/28_regex/traits/char/user_defined.cc: Add new tests.
      
      From-SVN: r243093
      974afa58
    • Segher Boessenkool's avatar
      combine: Emit a barrier after unconditional trap (PR78607) · 0f091278
      Segher Boessenkool authored
      After an unconditional trap there should be a barrier.  In most cases
      one is automatically inserted, but not if the trap is the final insn in
      the instruction stream.  We need to emit one explicitly.
      
      
      	PR rtl-optimization/78607
      	* combine.c (try_combine): Emit a barrier after a unconditional trap.
      
      gcc/testsuite/
      	PR rtl-optimization/78607
      	* gcc.c-torture/compile/pr78607.c: New testcase.
      
      From-SVN: r243092
      0f091278
    • GCC Administrator's avatar
      Daily bump. · e95a3eb3
      GCC Administrator authored
      From-SVN: r243091
      e95a3eb3
  2. Nov 30, 2016
    • Joseph Myers's avatar
      * es.po: Update. · 0f520356
      Joseph Myers authored
      From-SVN: r243085
      0f520356
    • Ian Lance Taylor's avatar
      runtime: print C functions in traceback · 24f1d7f8
      Ian Lance Taylor authored
          
          Since gccgo can trace back through C code as easily as Go code, we
          should print C functions in the traceback.
          
          This worked before https://golang.org/cl/31230 for a dumb reason.  The
          default value for runtime.traceback_cache was, and is, 2 << 2, meaning
          to print all functions.  The old C code for runtime_parsedebugvars
          would return immediately and do nothing if the environment variable
          GODEBUG was not set (if GODEBUG was set it would later call
          setTraceback.  The new Go code for runtime.parsedebugvars does not
          return immediately if GODEBUG is not set, and always calls
          setTraceback.  Either way, if GOTRACEBACK is not set, setTraceback
          would set traceback_cache to 1 << 2, meaning to only print non-runtime
          functions and having the effect of not printing plain C functions.
          
          Keep the current handling of GODEBUG/GOTRACEBACK, which matches the gc
          library, but add an extra check to print C functions by default.
          
          Reviewed-on: https://go-review.googlesource.com/33717
      
      From-SVN: r243083
      24f1d7f8
    • Uros Bizjak's avatar
      * testsuite/ChangeLog: Fix some entries. · df3f1277
      Uros Bizjak authored
      From-SVN: r243082
      df3f1277
    • Martin Sebor's avatar
      PR tree-optimization/78586 - [7 Regression] Wrong code caused by printf-return-value · 1124cf27
      Martin Sebor authored
      gcc/testsuite/ChangeLog:
      
      	PR tree-optimization/78586
      	* gcc.dg/tree-ssa/builtin-sprintf-2.c: New test cases.
      
      From-SVN: r243081
      1124cf27
    • Michael Meissner's avatar
      re PR target/78602 (PowerPC vec-extract-v2df.c can fail if -mcpu=power9 -O0) · bc28bbb6
      Michael Meissner authored
      2016-11-30  Michael Meissner  <meissner@linux.vnet.ibm.com>
      
      	PR target/78602
      	* config/rs6000/rs6000.c (rs6000_expand_vector_extract): If the
      	element is not a constant or in a register, force it to a
      	register.
      
      	PR target/78560
      	* config/rs6000/rs6000.c (rs6000_expand_vector_set): Force value
      	that will be set to a vector element to be in a register.
      	* config/rs6000/vsx.md (vsx_set_<mode>_p9): Fix thinko that used
      	the wrong multiplier to convert the element number to a byte
      	offset.
      
      From-SVN: r243044
      bc28bbb6
    • Alexander Monakov's avatar
      libgomp: move data definitions from icv.c back to env.c · 630e3c3a
      Alexander Monakov authored
      	* config/nvptx/env.c: Delete.
      	* icv.c: Move definitions of ICV variables back ...
      	* env.c: ...here.  Do not compile environment-related functionality if
      	LIBGOMP_OFFLOADED_ONLY is set.
      
      From-SVN: r243041
      630e3c3a
    • Alexander Monakov's avatar
      libgomp: introduce LIBGOMP_OFFLOADED_ONLY macro · 9e38af5c
      Alexander Monakov authored
      	* configure.ac [nvptx*-*-*] (libgomp_offloaded_only): Set and use it...
      	(LIBGOMP_OFFLOADED_ONLY): ...here; new define.
      	* configure: Regenerate.
      	* config.h.in: Likewise.
      
      From-SVN: r243040
      9e38af5c
    • Alexander Monakov's avatar
      libgomp: regenerate with automake-1.11.6 · f96b7f1f
      Alexander Monakov authored
      	* Makefile.in: Regenerate with automake-1.11.6.
      	* aclocal.m4: Likewise.
      	* configure: Likewise.
      	* testsuite/Makefile.in: Likewise.
      
      From-SVN: r243039
      f96b7f1f
    • Vladimir Makarov's avatar
      re PR tree-optimization/77856 (wrong code at -O2 on x86_64-linux-gnu in 32-bit mode) · f7abdf36
      Vladimir Makarov authored
      2016-11-30  Vladimir Makarov  <vmakarov@redhat.com>
      
      	PR tree-optimization/77856
      	* lra-constraints.c (inherit_in_ebb): Check original regno for
      	invalid invariant regs too.  Set only clobbered hard regs for the
      	invalid invariant regs.
      
      2016-11-30  Vladimir Makarov  <vmakarov@redhat.com>
      
      	PR tree-optimization/77856
      	* gcc.target/i386.c (pr77856.c): New.
      
      From-SVN: r243038
      f7abdf36
    • Matthias Klose's avatar
      configure.ac: Set BDW_GC_CFLAGS and BDW_GC_LIBS after checking for the existence of the... · de683d58
      Matthias Klose authored
      2016-11-30  Matthias Klose  <doko@ubuntu.com>
      
              * configure.ac: Set BDW_GC_CFLAGS and BDW_GC_LIBS after checking
              for the existence of the pkg-config modules.
              * Regenerate.
      
      From-SVN: r243037
      de683d58
    • Ville Voutilainen's avatar
      Fix testsuite failures caused by the patch implementing LWG 2534. · 3ba9051e
      Ville Voutilainen authored
      * include/std/istream (__is_convertible_to_basic_istream):
      Change the return types of __check, introduce istream_type.
      (operator>>(_Istream&&, _Tp&&)):
      Use __is_convertible_to_basic_istream::istream_type as the return type.
      * include/std/ostream (__is_convertible_to_basic_ostream):
      Change the return types of __check, introduce ostream_type.
      (operator>>(_Ostream&&, _Tp&&)):
      Use __is_convertible_to_basic_ostream::ostream_type as the return type.
      
      From-SVN: r243036
      3ba9051e
    • David Edelsohn's avatar
      917b47be
    • Andre Vehreschild's avatar
      single.c (_gfortran_caf_get_by_ref): Prevent compile time warning. · 8fb75185
      Andre Vehreschild authored
      libgfortran/ChangeLog:
      
      2016-11-30  Andre Vehreschild  <vehre@gcc.gnu.org>
      
              * caf/single.c (_gfortran_caf_get_by_ref): Prevent compile time
              warning.
              (_gfortran_caf_send_by_ref): Same.
              (_gfortran_caf_is_present): Prevent fallthrough warnings.
      
      gcc/testsuite/ChangeLog:
      
      2016-11-30  Andre Vehreschild  <vehre@gcc.gnu.org>
      
      	* ChangeLog: Removed wrongly placed entry.
      	* gfortran.dg/coarray_lib_alloc_4.f90: New test.
      
      From-SVN: r243034
      8fb75185
    • Pitchumani Sivanupandi's avatar
      Commit files forgotten in r242966. · bdc5f937
      Pitchumani Sivanupandi authored
      2016-11-30  Pitchumani Sivanupandi  <pitchumani.sivanupandi@microchip.com>
      
      	Commit files forgotten in r242966.
      
      	* config/avr/avr-arch.h (avr_mcu_t) [flash_size]: New member.
      	* config/avr/avr-devices.c (avr_mcu_types): Add flash size info.
      	* config/avr/gen-avr-mmcu-specs.c (print_mcu): Remove hard-coded
      	prefix check to find wrap-around value, instead use MCU flash size.
      	For 8k flash devices, update link_pmem_wrap spec string to
      	add --pmem-wrap-around=8k.
      	* config/avr/specs.h (LINK_RELAX_SPEC): Move link_pmem_wrap from
      	here...
      	(LINK_SPEC): ...to here.
      
      From-SVN: r243033
      bdc5f937
    • David Edelsohn's avatar
      new1.C: XFAIL on AIX. · 82c7aae6
      David Edelsohn authored
              * g++.dg/eh/new1.C: XFAIL on AIX.
              * g++.dg/eh/delete1.C: Same.
              * g++.dg/init/new40.C: Same.
              * g++.old-deja/g++.eh/new2.C: Same.
      
      From-SVN: r243032
      82c7aae6
    • David Malcolm's avatar
      Fix typo in testcase name · 9e604f92
      David Malcolm authored
      gcc/testsuite/ChangeLog:
      
      	PR c/78498
      	* gcc.dg/format/pr78494.c: Rename to...
      	* gcc.dg/format/pr78498.c: ...this.
      
      From-SVN: r243031
      9e604f92
    • David Malcolm's avatar
      libiberty: avoid reading past end of buffer in strndup/xstrndup (PR c/78498) · e613205c
      David Malcolm authored
      gcc/ChangeLog:
      	PR c/78498
      	* selftest.c (selftest::assert_strndup_eq): New function.
      	(selftest::test_strndup): New function.
      	(selftest::test_libiberty): New function.
      	(selftest::selftest_c_tests): Call test_libiberty.
      
      gcc/testsuite/ChangeLog:
      	PR c/78498
      	* gcc.dg/format/pr78494.c: New test case.
      
      libiberty/ChangeLog:
      	PR c/78498
      	* strndup.c (strlen): Delete decl.
      	(strnlen): Add decl.
      	(strndup): Call strnlen rather than strlen.
      	* xstrndup.c (xstrndup): Likewise.
      
      From-SVN: r243030
      e613205c
    • David Edelsohn's avatar
      ref-1.C: Don't XFAIL scan-assembler-not on AIX. · e6383ae7
      David Edelsohn authored
              * g++.dg/debug/dwarf2/ref-1.C: Don't XFAIL scan-assembler-not on AIX.
              * g++.dg/debug/dwarf2/imported-decl-2.C: Same.
              * g++.dg/debug/dwarf2/refqual-1.C: Same.
              * g++.dg/debug/dwarf2/refqual-2.C: Same.
      
      From-SVN: r243029
      e6383ae7
    • Segher Boessenkool's avatar
      ira: Don't substitute into TRAP_IF insns (PR78610) · 17a938e8
      Segher Boessenkool authored
      In the testcase, IRA propagates a constant into a TRAP_IF insn, which
      then becomes an unconditional trap.  Unconditional traps are control
      flow insns so doing this requires surgery on the cfg.  We cannot do
      that here, so instead refuse to do the substitution.
      
      
      	PR rtl-optimization/78610
      	* ira.c (combine_and_move_insns): Don't substitute into TRAP_IF
      	instructions.
      
      gcc/testsuite/
      	PR rtl-optimization/78610
      	* gcc.c-torture/compile/pr78610.c: New testcase.
      
      From-SVN: r243028
      17a938e8
    • Tim Shen's avatar
      Fix condition in shared_ptr assertion · 88811a97
      Tim Shen authored
      2016-11-30  Tim Shen  <timshen@google.com>
      
      	* include/bits/shared_ptr_base.h
      	(__shared_ptr_access<T, L, true, false>::operator*()): Fix assertion.
      
      From-SVN: r243027
      88811a97
    • Bin Cheng's avatar
      re PR tree-optimization/78574 (ice on valid C code at -O2 and -O3 in both 32-... · aec0ee11
      Bin Cheng authored
      re PR tree-optimization/78574 (ice on valid C code at -O2 and -O3 in both 32- and 64-bit modes on x86_64-linux-gnu (internal compiler error: Segmentation fault (program cc1)))
      
      	PR tree-optimization/78574
      	* tree-ssa-loop-ivopts.c (find_deriving_biv_for_expr): Skip loop
      	header PHI that doesn't define biv.
      	gcc/testsuite
      	PR tree-optimization/78574
      	* gcc.c-torture/compile/pr78574.c: New test.
      
      From-SVN: r243026
      aec0ee11
    • Andre Vehreschild's avatar
      Add the missing changelog entry to 243023. · 44cd68d2
      Andre Vehreschild authored
      libgfortran/ChangeLog:
      
      2016-11-30  Andre Vehreschild  <vehre@gcc.gnu.org>
      
              * caf/single.c (_gfortran_caf_is_present): Prevent fallthrough
              warnings.
      
      From-SVN: r243025
      44cd68d2
    • Andre Vehreschild's avatar
      single.c (_gfortran_caf_is_present): Prevent fallthrough warnings. · 9a0f2718
      Andre Vehreschild authored
      libgfortran/ChangeLog:
      
      2016-11-30  Andre Vehreschild  <vehre@gcc.gnu.org>
      
      	* caf/single.c (_gfortran_caf_is_present): Prevent fallthrough
      	warnings.
      
      From-SVN: r243024
      9a0f2718
    • David Edelsohn's avatar
      50594.cc: XFAIL on AIX. · 6d0e8a55
      David Edelsohn authored
              * testsuite/18_support/50594.cc: XFAIL on AIX.
              * testsuite/ext/mt_allocator/check_new.cc: Same.
              * testsuite/ext/pool_allocator/check_new.cc: Same.
              * testsuite/27_io/ios_base/storage/11584.cc: Same.
      
      From-SVN: r243023
      6d0e8a55
    • Arnaud Charlet's avatar
      [multiple changes] · 60aa5228
      Arnaud Charlet authored
      2016-11-30  Gary Dismukes  <dismukes@adacore.com>
      
      	* sem_prag.adb, sem_ch6.adb: Minor reformatting and typo fixes.
      	* g-sechas.adb: Minor reformatting.
      	* lib-xref.ads: minor grammar fix in comment.
      	* lib-xref-spark_specific.adb
      	(Is_SPARK_Reference): do not ignore references to concurrent
      	objects.
      	* sinfo.ads: Fix of unbalanced parens in comment
      
      2016-11-30  Ed Schonberg  <schonberg@adacore.com>
      
      	* lib-xref.adb (Get_Type_Reference): If the entity is a function
      	returning a classwide type, the type reference is obtained right
      	away and does not need further unwinding.
      
      2016-11-30  Javier Miranda  <miranda@adacore.com>
      
      	* sem_ch8.adb (Find_Renamed_Entity): For non-overloaded subprogram
      	actuals of generic units check that the spec of the renaming
      	and renamed entities match.
      
      2016-11-30  Tristan Gingold  <gingold@adacore.com>
      
      	* raise-gcc.c: For CERT runtimes: do not use gcc includes, simplify
      	the handling.
      	* sem_attr.adb (Analyze_Attribute): Check No_Dynamic_Priorities
      	restriction for Priority Attribute.
      
      From-SVN: r243022
      60aa5228
Loading