Skip to content
Snippets Groups Projects
  1. Jul 03, 2014
    • Jakub Jelinek's avatar
      libgomp.exp (libgomp_target_compile): If $source matches regex... · f707da16
      Jakub Jelinek authored
      libgomp.exp (libgomp_target_compile): If $source matches regex $lang_source_re, add $lang_include_flags to options.
      
      	* testsuite/lib/libgomp.exp (libgomp_target_compile): If $source
      	matches regex $lang_source_re, add $lang_include_flags to options.
      	* testsuite/libgomp.c/c.exp: Unset lang_include_flags.
      	* testsuite/libgomp.c++/c++.exp: Likewise.
      	* testsuite/libgomp.fortran/fortran.exp: Likewise.  Set lang_source_re
      	and lang_include_flags instead of adding -fintrinsic-modules-path= to
      	ALWAYS_CFLAGS.
      	* testsuite/libgomp.graphite/graphite.exp: Unset lang_include_flags.
      
      From-SVN: r212268
      f707da16
    • Segher Boessenkool's avatar
      Fix the shift patterns, and add test · 9e5f78f1
      Segher Boessenkool authored
      Firstly, it adds back the split conditions that I accidentally removed.
      Without it the dot insns are never generated, or rather, always split
      back to a separate compare instruction.
      
      Secondly, the shift amount should be SI always, not GPR, or GCC will
      insert a zero-extend at expand time that it cannot get rid of later.
      
      The test tests whether dot-form instructions are generated for both
      "dot" and "dot2" cases, that is, with just a CC output or also a GPR
      output; for all four basic shifts, with a register amount or an
      immediate amount.  It also tests for superfluous zero-extends.  This
      also tests if combine "simplifies" the rotates to right-rotates, which
      it shouldn't do anymore.
      
      From-SVN: r212267
      9e5f78f1
    • Thomas Schwinge's avatar
      Explain gfortran-dg-runtest usage in libgomp Fortran testing. · 07b6c044
      Thomas Schwinge authored
      	libgomp/
      	* testsuite/libgomp.fortran/fortran.exp: Explain
      	gfortran-dg-runtest usage.
      
      From-SVN: r212266
      07b6c044
    • Richard Earnshaw's avatar
      arm.md (arch): Add armv6_or_vfpv3. · a89b02c0
      Richard Earnshaw authored
      	* arm.md (arch): Add armv6_or_vfpv3.
      	(arch_enabled): Add test for the above.
      	* vfp.md (divsf_vfp, divdf_vfp): Add earlyclobber when code can run
      	on VFP9.
      	(sqrtsf_vfp, sqrtdf_vfp): Likewise.
      
      From-SVN: r212265
      a89b02c0
    • Jakub Jelinek's avatar
      gcov-io.c (gcov_read_words): Don't call memmove if excess is 0. · 00a7ba58
      Jakub Jelinek authored
      	* gcov-io.c (gcov_read_words): Don't call memmove if excess is 0.
      	* data-streamer-in.c (streamer_read_hwi): Shift UHWI 1 instead of
      	HWI 1 and negate the unsigned value.
      	* expmed.c (expand_sdiv_pow2): For modes wider than word always
      	use AND instead of shift.
      	* wide-int-print.cc (print_decs): Negate UHWI instead of HWI.
      c-family/
      	* c-ada-spec.c (dump_ada_nodes): Don't call qsort if 
      	comments->count <= 1, as comments->entries might be NULL.
      
      From-SVN: r212264
      00a7ba58
    • Francois-Xavier Coudert's avatar
      ieee_1.F90: Mark variables as volatile to avoid optimization. · e2152673
      Francois-Xavier Coudert authored
      	* gfortran.dg/ieee/ieee_1.F90: Mark variables as volatile to
      	avoid optimization.
      
      From-SVN: r212261
      e2152673
    • Marek Polacek's avatar
      invoke.texi (-fsanitize=bounds): Tweak wording. · e71d7987
      Marek Polacek authored
      	* doc/invoke.texi (-fsanitize=bounds): Tweak wording.
      	(-fsanitize=float-divide-by-zero): Move to the table with
      	-fsanitize=undefined suboptions.
      	(-fsanitize=float-cast-overflow): Likewise.
      
      From-SVN: r212260
      e71d7987
    • Maciej W. Rozycki's avatar
      rs6000.c (rs6000_adjust_atomic_subword): Use BYTES_BIG_ENDIAN rather than... · 283bbe35
      Maciej W. Rozycki authored
      rs6000.c (rs6000_adjust_atomic_subword): Use BYTES_BIG_ENDIAN rather than WORDS_BIG_ENDIAN to check for byte endianness.
      
      	* config/rs6000/rs6000.c (rs6000_adjust_atomic_subword): Use
      	BYTES_BIG_ENDIAN rather than WORDS_BIG_ENDIAN to check for byte
      	endianness.
      
      From-SVN: r212258
      283bbe35
    • Tobias Burnus's avatar
      scanner.c (skip_free_comments): Fix indentation. · 90c4f6ba
      Tobias Burnus authored
      2014-07-03  Tobias Burnus  <burnus@net-b.de>
      
              * scanner.c (skip_free_comments): Fix indentation.
      
      From-SVN: r212257
      90c4f6ba
    • Zhenqiang Chen's avatar
      loop-invariant.c (struct invariant): Add a new member: eqno; · e42e3d15
      Zhenqiang Chen authored
      ChangeLog:
      2014-07-03  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
      
      	* loop-invariant.c (struct invariant): Add a new member: eqno;
      	(find_identical_invariants): Update eqno;
      	(create_new_invariant): Init eqno;
      	(get_inv_cost): Compute comp_cost with eqno;
      
      
      testsuite/ChangeLog:
      2014-07-03  Zhenqiang Chen  <zhenqiang.chen@linaro.org>
      
      	* gcc.target/arm/identical-invariants.c: New test.
      
      From-SVN: r212256
      e42e3d15
    • GCC Administrator's avatar
      Daily bump. · 44a63811
      GCC Administrator authored
      From-SVN: r212253
      44a63811
  2. Jul 02, 2014
    • Segher Boessenkool's avatar
      Only transform rotate to rotatert and v.v. if target has both · 4ed3092f
      Segher Boessenkool authored
      Many targets do not have both rotate and rotatert.  Of the 47 targets
      in the tree, 17 have both, 9 have only rotate, 2 have only rotatert, and
      19 have neither (this is based on "grep -wil" so it can be slightly off).
      
      rs6000 has only rotate, and mips has only rotatert.  For such targets
      simplifying rotate to rotatert and vice versa is not simplifying things
      at all.  rs6000 has already way too many rotate patterns (some days it
      seems like two thousand, but it is somewhat less in reality still); I
      would prefer not to double that again.
      
      So, this patch makes genrecog define HAVE_rotate and HAVE_rotatert if
      those RTL codes are mentioned anywhere in the machine description, and
      then does the transformation in simplify-rtx.c only if both these flags
      are set.
      
      From-SVN: r212239
      4ed3092f
    • Uros Bizjak's avatar
      * config/fpu-sysv.h (void set_fpu): Remove stalled comment. · 1680a432
      Uros Bizjak authored
      From-SVN: r212235
      1680a432
    • Jan Hubicka's avatar
      c-decl.c (duplicate_decls): CLear DECL_STRUCT_FUNCTION before releasing symbol. · 22e1cf1c
      Jan Hubicka authored
      
      	* c-decl.c (duplicate_decls): CLear DECL_STRUCT_FUNCTION before
      	releasing symbol.
      
      	* gcc.c-torture/compile/section.c: New testcase.
      
      Co-Authored-By: default avatarChen Gang <gang.chen.5i5j@gmail.com>
      
      From-SVN: r212234
      22e1cf1c
    • Ian Lance Taylor's avatar
      re PR go/61620 (FAIL: go.test/test/fixedbugs/bug242.go execution, -O2 -g) · 9490fda6
      Ian Lance Taylor authored
      	PR go/61620
      
      runtime: Don't free tiny blocks in map deletion.
      
      The memory allocator now has a special case for tiny blocks
      (smaller than 16 bytes) and they can not be explicitly freed.
      
      From-SVN: r212233
      9490fda6
    • Christian Bruel's avatar
      add bugzilla links · 513c5c74
      Christian Bruel authored
      From-SVN: r212232
      513c5c74
    • Christian Bruel's avatar
      add test · cbee452f
      Christian Bruel authored
      From-SVN: r212231
      cbee452f
    • Christian Bruel's avatar
      Support mode toggle. · cbb1e3d9
      Christian Bruel authored
      * mode-switching.c (struct bb_info): Add mode_out, mode_in caches.
      (make_preds_opaque): Delete.
      (clear_mode_bit, mode_bit_p, set_mode_bit): New macros.
      (commit_mode_sets): New function.
      (optimize_mode_switching): Handle current_mode to mode_switching_emit.
      Process all modes at once.
      * basic-block.h (pre_edge_lcm_avs): Declare.
      * lcm.c (pre_edge_lcm_avs): Renamed from pre_edge_lcm.
      Call clear_aux_for_edges. Fix comments.
      (pre_edge_lcm): New wrapper function to call pre_edge_lcm_avs.
      (pre_edge_rev_lcm): Idem.
      * config/epiphany/epiphany.c (emit_set_fp_mode): Add prev_mode parameter.
      * config/epiphany/epiphany-protos.h (emit_set_fp_mode): Idem.
      * config/epiphany/resolve-sw-modes.c (pass_resolve_sw_modes::execute): Idem.
      * config/i386/i386.c (x96_emit_mode_set): Idem.
      * config/sh/sh.c (sh_emit_mode_set): Likewise. Handle PR toggle.
      * config/sh/sh.md (toggle_pr): 	Defined if TARGET_FPU_SINGLE.
      (fpscr_toggle) Disallow from delay slot.
      * target.def (emit_mode_set): Add prev_mode parameter.
      * doc/tm.texi: Regenerate.
      
      From-SVN: r212230
      cbb1e3d9
    • Jakub Jelinek's avatar
      decl.c (variable_decl): Reject old style initialization for derived type components. · b18f1efc
      Jakub Jelinek authored
      
      	* decl.c (variable_decl): Reject old style initialization
      	for derived type components.
      
      	* gfortran.dg/oldstyle_5.f: New test.
      
      Co-Authored-By: default avatarFritz Reese <Reese-Fritz@zai.com>
      
      From-SVN: r212227
      b18f1efc
    • Francois-Xavier Coudert's avatar
      * config/fpu-glibc.h: Fix comment about FE_DENORMAL. · 4a72ba02
      Francois-Xavier Coudert authored
      From-SVN: r212226
      4a72ba02
    • Kyrylo Tkachov's avatar
      [AArch64] Removed unused variable i in aarch64_expand_vec_perm · c9d1a16a
      Kyrylo Tkachov authored
      	* config/aarch64/aarch64.c (aarch64_expand_vec_perm): Delete unused
      	variable i.
      
      From-SVN: r212225
      c9d1a16a
    • Uros Bizjak's avatar
      configure.host (ieee_flags): Add -mieee for alpha*. · 5b0936da
      Uros Bizjak authored
      libgfortran/ChangeLog:
      
      	* configure.host (ieee_flags): Add -mieee for alpha*.
      
      	* config/fpu-glibc.h (support_fpu_rounding_mode): Correctly handle
      	GFC_FPE_UPWARD, GFC_FPE_DOWNWARD and GFC_FPE_TOWARDZERO.
      	* config/fpu-aix.h (support_fpu_rounding_mode): Ditto.
      
      testsuite/ChangeLog:
      
      	* gfortran.dg/ieee/ieee_1.F90 (dg-additional-options): Remove -O0.
      	* gfortran.dg/ieee/ieee_rounding_1.f90 (dg-additional-options): Add.
      
      From-SVN: r212224
      5b0936da
    • Paolo Carlini's avatar
      pt.c (convert_template_argument): Use inform instead of error in three places. · bca23ca2
      Paolo Carlini authored
      /cp
      2014-07-02  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* pt.c (convert_template_argument): Use inform instead of error in
      	three places.
      
      /testsuite
      2014-07-02  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* g++.dg/cpp0x/variadic-ex10.C: Adjust for inform instead of error.
      	* g++.dg/cpp0x/variadic-ex14.C: Likewise.
      	* g++.dg/parse/error11.C: Likewise.
      	* g++.old-deja/g++.brendan/template17.C: Likewise.
      
      From-SVN: r212223
      bca23ca2
    • Jan Hubicka's avatar
      ipa-utils.h (method_class_type, [...]): Constify. · d570d364
      Jan Hubicka authored
      	* ipa-utils.h (method_class_type, vtable_pointer_value_to_binfo,
      	vtable_pointer_value_to_vtable): Constify.
      	(contains_polymorphic_type_p): Declare.
      	* ipa-devirt.c (method_class_type, vtable_pointer_value_to_binfo,
      	vtable_pointer_value_to_vtable): Constify.
      	(contains_polymorphic_type_p): New predicate.
      	* ipa-prop.c (ipa_set_jf_known_type): Allow types containing
      	polymorphic types.
      	(ipa_set_ancestor_jf): Likewise.
      	(detect_type_change): Return false in easy cases.
      	(compute_complex_assign_jump_func): Require type to contain
      	polymorphic type.
      	(compute_known_type_jump_func): Likewise.
      
      From-SVN: r212222
      d570d364
    • Tobias Burnus's avatar
      get_array.f90: Add missing SYNC ALL. · a90532fd
      Tobias Burnus authored
      2014-07-02  Tobias Burnus  <burnus@net-b.de>
      
              * gfortran.dg/coarray/get_array.f90: Add missing SYNC ALL.
              * gfortran.dg/coarray/send_array.f90: Ditto.
              * gfortran.dg/coarray/sendget_array.f90: Ditto.
      
      From-SVN: r212220
      a90532fd
    • Jan Hubicka's avatar
      tree.c (decls_same_for_odr, [...]): Remove. · 549bcbd1
      Jan Hubicka authored
      	* tree.c (decls_same_for_odr, decls_same_for_odr,
      	types_same_for_odr): Remove.
      	(type_in_anonymous_namespace_p): Constify argument.
      	* tree.h (types_same_for_odr, type_in_anonymous_namespace_p):
      	Constify.
      	* ipa-devirt.c (odr_type_d): Add ODR_VIOLATED field.
      	(main_odr_variant): New function.
      	(hash_type_name): Make static; update assert; do not ICE on
      	non-records.
      	(types_same_for_odr): Bring here from tree.c; simplify
      	and remove old structural comparing code that doesn't work
      	for templates.
      	(odr_hasher::equal): Update assert.
      	(add_type_duplicate): Return true when bases should be computed;
      	replace incomplete loader by complete; do not output duplicated
      	warnings; do not ICE on non-records; set odr_violated flag.
      	(get_odr_type): Be ready to replace incomplete type by complete
      	one; work on ODR variants instead of main variants; reorder item
      	in array so bases have still smaller indexes.
      	(dump_type_inheritance_graph): Be ready for holdes in odr_types
      	array.
      	(possible_polymorphic_call_targets): Do not ICE when BINFO is NULL.
      
      From-SVN: r212218
      549bcbd1
    • GCC Administrator's avatar
      Daily bump. · 5656ccd7
      GCC Administrator authored
      From-SVN: r212217
      5656ccd7
  3. Jul 01, 2014
    • Ian Lance Taylor's avatar
      runtime: introduce build targets for running benchmarks · ffa98da4
      Ian Lance Taylor authored
      This introduces the "bench" build target, which can be used to run
      all benchmarks.
      
      It is also possible to run subsets of benchmarks with the
      "package/check" build targets by setting GOBENCH to a matching regex.
      
      From-SVN: r212212
      ffa98da4
    • Cary Coutant's avatar
      This patch fixes a couple of ICEs when using -gsplit-dwarf. · 25eff60d
      Cary Coutant authored
      When compiling a small-enough compilation unit that has no address table
      entries, but complex enough that -freorder-blocks-and-partition produces
      location lists, dwarf2out_finish does not call index_location_lists, but
      optimize_location_lists will later assume that the addr_index_table has
      been indexed.
      Google ref: b/15417905
      
      When resolve_addr_in_expr replaces a CONST_STRING rtx, it directly
      updates the pointer to the old expression with the new one. In the
      case of a DW_OP_GNU_addr_index or DW_OP_GNU_const_index, that pointer
      may be in an address table entry, which is keyed by the rtx. Instead
      of directly replacing the pointer, we need to remove the old address
      table entry (i.e., decrement its reference count), and add a new one.
      Google ref: b/15957101
      
      gcc/
      	* dwarf2out.c (remove_addr_table_entry): Remove unnecessary hash table
              lookup.
      	(resolve_addr_in_expr): When replacing the rtx in a location list
              entry, get a new address table entry.
      	(dwarf2out_finish): Call index_location_lists even if there are no
              addr_index_table entries yet.
      
      From-SVN: r212211
      25eff60d
    • James Greenhalgh's avatar
      gcc/testsuite/ · 454a17a3
      James Greenhalgh authored
      
      	* gcc.target/aarch64/aapcs64/aapcs64.exp:
      	(additional_flags_for_func_ret): New variable based on $additional_flags
      	with -fno-use-caller-save.
      	(func-ret-*.c): Use the new variable.
      
      Co-Authored-By: default avatarYufeng Zhang <yufeng.zhang@arm.com>
      
      From-SVN: r212206
      454a17a3
    • Paolo Carlini's avatar
      re PR c++/59637 ([c++11] ICE with decltype and destructor call in template) · 2a4141aa
      Paolo Carlini authored
      2014-07-01  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR c++/59637
      	* g++.dg/cpp0x/decltype60.C: New.
      
      From-SVN: r212205
      2a4141aa
    • Trevor Saunders's avatar
      revert r212197 for apparently not actually being obvious · 6ab56804
      Trevor Saunders authored
      From-SVN: r212200
      6ab56804
    • Dodji Seketeli's avatar
      Revert "PR preprocessor/60723 - missing system-ness marks for macro tokens" · 14b1760c
      Dodji Seketeli authored
      This reverts commit 747e04f26ac3fb775bfc9af61e9170b9461b6cfc.
      
      From-SVN: r212199
      14b1760c
    • Teresa Johnson's avatar
      Correct ChangeLog entries from r212041. · 08eedf75
      Teresa Johnson authored
      From-SVN: r212198
      08eedf75
    • Trevor Saunders's avatar
      fix -Wunused-parameter warning in winnt.c · 5c9130b3
      Trevor Saunders authored
      gcc/
      	* config/i386/winnt.c (i386_pe_section_type_flags): Removed name
      	of unused argument.
      
      From-SVN: r212197
      5c9130b3
    • Kyrylo Tkachov's avatar
      [AArch64] Implement some vca*_f[32,64] intrinsics. · 39f90912
      Kyrylo Tkachov authored
      	* config/aarch64/arm_neon.h (vcage_f64): New intrinsic.
      	(vcagt_f64): Likewise.
      	(vcale_f64): Likewise.
      	(vcaled_f64): Likewise.
      	(vcales_f32): Likewise.
      	(vcalt_f64): Likewise.
      	(vcaltd_f64): Likewise.
      	(vcalts_f32): Likewise.
      
      	* gcc.target/aarch64/simd/vcage_f64.c: New test.
      	* gcc.target/aarch64/simd/vcagt_f64.c: Likewise.
      	* gcc.target/aarch64/simd/vcale_f64.c: Likewise.
      	* gcc.target/aarch64/simd/vcaled_f64.c: Likewise.
      	* gcc.target/aarch64/simd/vcales_f32.c: Likewise.
      	* gcc.target/aarch64/simd/vcalt_f64.c: Likewise.
      	* gcc.target/aarch64/simd/vcaltd_f64.c: Likewise.
      	* gcc.target/aarch64/simd/vcalts_f32.c: Likewise.
      
      From-SVN: r212196
      39f90912
    • Paolo Carlini's avatar
      pr59867.C: Fix target selector. · f2805643
      Paolo Carlini authored
      2014-07-01  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* g++.dg/cpp1y/pr59867.C: Fix target selector.
      
      From-SVN: r212195
      f2805643
    • Dodji Seketeli's avatar
      PR preprocessor/60723 - missing system-ness marks for macro tokens · a0bc2268
      Dodji Seketeli authored
      
      When a system macro is expanded in a non-system file during
      out-of-line preprocessing, it can happen that the preprocessor forgets
      to emit line markers to express the system-ness status of tokens that
      come after the expansion of the macro.
      
      That can lead to situations where the entire non-system file can be
      considered as being a system file and thus have its warnings be
      discarded during the compilation of the resulting preprocessed file.
      
      My understanding is that this is due to the preprocessor not
      systematically detecting (and reporting) the change in system-ness of
      tokens.
      
      And this is what this patch does.  Each time the system-ness of a
      given token is different from the previous token that was emitted by
      the preprocessor, it emits a line marker for the sole purpose of
      marking the new system-ness of the subsequent tokens to come.
      
      Bootstrapped and tested on x86_64-unknown-linux-gnu against trunk.
      
      gcc/c-family/ChangeLog:
      	* c-ppoutput.c (struct print::prev_was_system_token): New data
      	member.
      	(init_pp_output): Initialize it.
      	(maybe_print_line_1, maybe_print_line, print_line_1, print_line)
      	(do_line_change): Return a flag saying if a line marker was
      	emitted or not.
      	(scan_translation_unit): Detect if the system-ness of the token we
      	are about to emit is different from the one of the previously
      	emitted token.  If so, emit a line marker.  Avoid emitting
      	useless adjacent line markers.
      	(scan_translation_unit_directives_only): Adjust.
      
      gcc/testsuite/ChangeLog:
      	* gcc.dg/cpp/syshdr{4,5}.{c,h}: New test files.
      
      Signed-off-by: default avatarDodji Seketeli <dodji@redhat.com>
      
      From-SVN: r212194
      a0bc2268
    • Marek Polacek's avatar
      invoke.texi: Document -Wint-conversion. · 52ec0ea3
      Marek Polacek authored
      	* doc/invoke.texi: Document -Wint-conversion.
      c-family/
      	* c.opt (Wint-conversion): New option.
      c/
      	* c-typeck.c (convert_for_assignment): Pass OPT_Wint_conversion
      	instead of 0 to WARN_FOR_ASSIGNMENT.
      testsuite/
      	* gcc.dg/Wint-conversion.c: New test.
      
      From-SVN: r212193
      52ec0ea3
    • Marek Polacek's avatar
      re PR c/58286 (Need option to make incompatible pointer type warnings into compiler errors) · d5c3d343
      Marek Polacek authored
      	PR c/58286
      	* doc/invoke.texi: Document -Wincompatible-pointer-types.
      c-family/
      	* c.opt (Wincompatible-pointer-types): New option.
      c/
      	* c-typeck.c (convert_for_assignment): Pass
      	OPT_Wincompatible_pointer_types instead of 0 to WARN_FOR_ASSIGNMENT.
      testsuite/
      	* gcc.dg/Wincompatible-pointer-types.c: New test.
      
      From-SVN: r212192
      d5c3d343
Loading