Skip to content
Snippets Groups Projects
  1. Oct 24, 2013
    • Andrew MacLeod's avatar
      builtins.c (dummy_object, [...]): Move to gimplify.c. · 4a7cb16f
      Andrew MacLeod authored
      
      	* builtins.c (dummy_object, gimplify_va_arg_expr): Move to gimplify.c.
      	* gimplify.c (build_va_arg_indirect_ref, std_gimplify_va_arg_expr):
      	Move to targhooks.c.
      	(dummy_object, gimplify_va_arg_expr): Relocate from builtins.c.
      	* targhooks.c (build_va_arg_indirect_ref, std_gimplify_va_arg_expr):
      	Relocate from gimplify.c.
      	* targhooks.h: Add 2 prototypes.
      	* tree.h. Delete 2 prototypes.
      
      From-SVN: r204032
      4a7cb16f
    • Igor Shevlyakov's avatar
      tree-ssa-loop-ivopts.c (multiplier_allowed_in_address_p ): Check both... · f258df2d
      Igor Shevlyakov authored
      tree-ssa-loop-ivopts.c (multiplier_allowed_in_address_p ): Check both [reg+mult*reg] and [mult*reg] to determine if multiplier is allowed.
      
      	* tree-ssa-loop-ivopts.c (multiplier_allowed_in_address_p ): Check both
      	[reg+mult*reg] and [mult*reg] to determine if multiplier is allowed.
      
      From-SVN: r204031
      f258df2d
    • Cong Hou's avatar
      convert.c (convert_to_real): Guard those unsafe math function convertions with... · 247dbcf4
      Cong Hou authored
      convert.c (convert_to_real): Guard those unsafe math function convertions with flag_unsafe_math_optimizations.
      
      2013-10-24  Cong Hou  <congh@google.com>
      
          * convert.c (convert_to_real): Guard those unsafe math function
            convertions with flag_unsafe_math_optimizations.  Handle sqrt()
            specially. 
      
      2013-10-24  Cong Hou  <congh@google.com>
      
          * gcc.c-torture/execute/20030125-1.c: Update.
      
      From-SVN: r204028
      247dbcf4
    • Markus Trippelsdorf's avatar
      re PR other/58712 (issues found by --enable-checking=valgrind) · 51ce0547
      Markus Trippelsdorf authored
              PR ipa/58712
              * cgraph.c (cgraph_create_edge_1): Add indirect_unknown_callee
              as argument.
              (cgraph_create_edge): Use the new argument.
              (cgraph_create_indirect_edge): Likewise.
      
      From-SVN: r204026
      51ce0547
    • Joern Rennecke's avatar
      Add missing part for last ChangeLog entry: · c0f5c38c
      Joern Rennecke authored
      	(arc_ifcvt) <case 1 and 2>: Check that arc_ccfsm_post_advance
      	changes statep->state.
      
      From-SVN: r204025
      c0f5c38c
    • Joern Rennecke's avatar
      arc.c (arc_ccfsm_post_advance): Also handle TYPE_UNCOND_BRANCH. · 53ea364f
      Joern Rennecke authored
              * gcc/config/arc/arc.c (arc_ccfsm_post_advance): Also handle
              TYPE_UNCOND_BRANCH.
      
      From-SVN: r204024
      53ea364f
    • Tobias Burnus's avatar
      re PR fortran/44646 ([F08] Implement DO CONCURRENT) · 2ca4e2c2
      Tobias Burnus authored
      2013-10-24  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/44646
              * trans-stmt.c (struct forall_info): Add do_concurrent field.
              (gfc_trans_forall_1): Set it for do concurrent.
              (gfc_trans_forall_loop): Mark those as annot_expr_ivdep_kind.
      
      2013-10-24  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/44646
              * gfortran.dg/vect/vect-do-concurrent-1.f90: New.
      
      From-SVN: r204023
      2ca4e2c2
    • Dehao Chen's avatar
      devirt3.C: New test. · a2ad7995
      Dehao Chen authored
      2013-10-24  Dehao Chen  <dehao@google.com>
      
      	* g++.dg/opt/devirt3.C: New test.
      
      From-SVN: r204022
      a2ad7995
    • Tobias Burnus's avatar
      re PR other/33426 (Support of #pragma ivdep) · 8170608b
      Tobias Burnus authored
      2013-08-24  Tobias Burnus  <burnus@net-b.de>
      
              PR other/33426
              * c-pragma.c (init_pragma) Add #pragma ivdep handling.
              * c-pragma.h (pragma_kind): Add PRAGMA_IVDEP.
      
              PR other/33426
              * c-parser.c (c_parser_pragma, c_parser_for_statement):
              Handle PRAGMA_IVDEP.
              (c_parser_statement_after_labels): Update call.
      
              PR other/33426
              * tree-cfg.c (replace_loop_annotate): New function.
              (execute_build_cfg): Call it.
              * gimplify.c (gimple_boolify, gimplify_expr): Handle
              * ANNOTATE_EXPR.
              * internal-fn.c (expand_ANNOTATE): New function.
              * internal-fn.def (ANNOTATE): Define as new internal function.
              * tree-core.h (tree_node_kind): Add annot_expr_ivdep_kind.
              * tree-pretty-print.c (dump_generic_node): Handle ANNOTATE_EXPR.
              * tree.def (ANNOTATE_EXPR): New DEFTREECODE.
              * doc/extend.texi (Pragmas): Document #pragma ivdep.
              * doc/generic.texi (Expressions): Document ANNOTATE_EXPR.
      
              PR other/33426
              * testsuite/gcc.dg/ivdep.c: New.
              * testsuite/gcc.dg/vect/vect-ivdep-1.c: New.
      
      From-SVN: r204021
      8170608b
    • Kyrylo Tkachov's avatar
      c-output-mod-2.c: Fix for -fPIC. · a079f50a
      Kyrylo Tkachov authored
      [gcc/testsuite/]
      2013-10-24  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
      
      	* gcc.target/aarch64/c-output-mod-2.c: Fix for -fPIC.
      	* gcc.target/aarch64/c-output-mod-3.c: Likewise.
      
      From-SVN: r204019
      a079f50a
    • Ian Bolton's avatar
      [AArch64,PATCH] Adjust preferred_reload_class of SP+C · 27bd251b
      Ian Bolton authored
      
      Co-Authored-By: default avatarMarcus Shawcroft <marcus.shawcroft@arm.com>
      
      From-SVN: r204018
      27bd251b
    • Nick Clifton's avatar
      * gcc.dg/20020312-2.c: No PIC register for RL78 or MSP430. · ac63f305
      Nick Clifton authored
      From-SVN: r204017
      ac63f305
    • Michael Matz's avatar
      gengtype.c (is_file_equal): Check that files will be same length. · 01b974c9
      Michael Matz authored
      	* gengtype.c (is_file_equal): Check that files will be same
      	length.
      
      From-SVN: r204015
      01b974c9
    • Marek Polacek's avatar
      re PR c++/58705 ([c++11] ICE with invalid initializer for _Complex variable) · 320a9762
      Marek Polacek authored
      	PR c++/58705
      cp/
      	* typeck2.c (check_narrowing): Don't check narrowing when the scalar
      	initializer is empty.
      testsuite/
      	* g++.dg/parse/pr58705.C: New test.
      
      From-SVN: r204014
      320a9762
    • Christian Bruel's avatar
      config.gcc (sh-*): Add sh-mem.o to extra_obj. · 8e701300
      Christian Bruel authored
      2013-10-25  Christian Bruel  <christian.bruel@st.com>
      
      	* config.gcc (sh-*): Add sh-mem.o to extra_obj.
      	* gcc/config/sh/t-sh (sh-mem.o): New rule.
      	* gcc/config/sh/sh-mem.cc (expand_block_move): Moved here.
      	(sh4_expand_cmpstr): New function.
      	* gcc/config/sh/sh.c (force_into, expand_block_move): Move to sh-mem.cc
      	* gcc/config/sh/sh-protos.h (sh4_expand_cmpstr): Declare.
      	* gcc/config/sh/sh.md (cmpstrsi, cmpstr_t): New patterns.
      	(rotlhi3_8): Rename.
      
      From-SVN: r204013
      8e701300
    • Marek Polacek's avatar
      c-parser.c (c_parser_struct_declaration): Add a comment. · f28aa681
      Marek Polacek authored
      c/
      	* c-parser.c (c_parser_struct_declaration): Add a comment.
      	(c_parser_declarator): Don't allow _Alignas here.
      testsuite/
      	* gcc.dg/c1x-align-5.c: Add more testing.
      
      From-SVN: r204007
      f28aa681
    • Jan-Benedict Glaw's avatar
      configure.ac (ZW_PROG_COMPILER_DEPENDENCIES): Use CXX instead of CC. · 54c09437
      Jan-Benedict Glaw authored
      2013-10-24  Jan-Benedict Glaw  <jbglaw@lug-owl.de>
      
      	* configure.ac (ZW_PROG_COMPILER_DEPENDENCIES): Use CXX instead of CC.
      	* Makefile.in (CXXDEPMODE): Assign and change users.
      	(CCDEPMODE): Delete.
      	* configure: Regenerate.
      
      From-SVN: r204006
      54c09437
    • Rainer Orth's avatar
      Fix Ada bootstrap with Solaris /bin/ksh · 2f9bcd44
      Rainer Orth authored
      	* gcc-interface/Make-lang.in (ADA_DEPS): Fix quoting.
      
      From-SVN: r204005
      2f9bcd44
    • David Malcolm's avatar
      gengtype: parse base classes for some GTY-marked types · 18aa2b04
      David Malcolm authored
      2013-10-23  David Malcolm  <dmalcolm@redhat.com>
      
      	* gengtype-parse.c (require_without_advance): New.
      	(type): For GTY-marked types that are not GTY((user)), parse any
      	base classes, requiring them to be single-inheritance, and not
      	be templates.  For non-GTY-marked types and GTY((user)),
      	continue to skip over any C++ inheritance specification.
      	* gengtype-state.c (state_writer::write_state_struct_type):
      	Write base class of type (if any).
      	(read_state_struct_type): Read base class of type (if any).
      	* gengtype.c (new_structure): Add a "base_class" parameter.
      	(create_optional_field_): Update for new parameter to
      	new_structure.
      	(adjust_field_rtx_def): Likewise.
      	(adjust_field_tree_exp): Likewise.
      	* gengtype.h (struct type): Add "base_class" field to the s
      	union field.
      	(new_structure): Add "base" parameter.
      
      From-SVN: r204003
      18aa2b04
    • GCC Administrator's avatar
      Daily bump. · 2f3097a3
      GCC Administrator authored
      From-SVN: r204000
      2f3097a3
  2. Oct 23, 2013
    • Ian Lance Taylor's avatar
    • Chris Jefferson's avatar
      testsuite_containergen.h: New. · c2240038
      Chris Jefferson authored
      
      2013-10-23  Chris Jefferson  <chris@bubblescope.net>
      	    Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* testsuite/util/testsuite_containergen.h: New.
      	* testsuite/util/testsuite_iterators.h (test_container<>::val): Add.
      	* testsuite/25_algorithms/nth_element/random_test.cc: New, use the
      	above.
      	* testsuite/25_algorithms/partial_sort/random_test.cc: Likewise.
      	* testsuite/25_algorithms/partial_sort_copy/random_test.cc: Likewise.
      	* testsuite/25_algorithms/sort/random_test.cc: Likewise.
      
      Co-Authored-By: default avatarPaolo Carlini <paolo.carlini@oracle.com>
      
      From-SVN: r203995
      c2240038
    • Pat Haugen's avatar
      direct-move.h: Fix header for executable tests. · c19d33d8
      Pat Haugen authored
      	* gcc.target/powerpc/direct-move.h: Fix header for executable tests.
      
      From-SVN: r203994
      c19d33d8
    • Gerald Pfeifer's avatar
      * testsuite/test-expandargv.c: Include unistd.h. · 89ac0797
      Gerald Pfeifer authored
      From-SVN: r203993
      89ac0797
    • Gerald Pfeifer's avatar
      Fix up ChangeLog entries (name, e-mail, formatting, otherwise). · ecdbd01a
      Gerald Pfeifer authored
      From-SVN: r203992
      ecdbd01a
    • Sriraman Tallam's avatar
      re PR target/57756 (Function target attribute is retaining state of previously seen function) · 33e7f993
      Sriraman Tallam authored
      PR target/57756
      
      Replace further references to global_options in functions
      ix86_option_override_internal and ix86_valid_target_attribute_tree
      in config/i386/i386.c.
      
      	PR target/57756
      	* config/i386/i386.c (ix86_option_override_internal):
      	Change TARGET_SSE2 to TARGET_SSE2_P (opts->...)
      	(ix86_valid_target_attribute_tree):
      	Change TARGET_64BIT to TARGET_64BIT_P (opts->...)
      	Change TARGET_SSE to TARGET_SSE_P (opts->...)
      
      From-SVN: r203991
      33e7f993
    • Jason Merrill's avatar
      LWG 2165 · e2fbf4c5
      Jason Merrill authored
      	LWG 2165
      	* method.c (defaulted_late_check): Delete on eh-spec mismatch.
      	(maybe_explain_implicit_delete): Explain it.
      
      From-SVN: r203989
      e2fbf4c5
    • Jason Merrill's avatar
      c-format.c (gcc_cxxdiag_char_table): Add %X. · 3f04b1bb
      Jason Merrill authored
      c-family/
      	* c-format.c (gcc_cxxdiag_char_table): Add %X.
      cp/
      	* error.c (eh_spec_to_string): New.
      	(cp_printer): Use it for %X.
      
      From-SVN: r203988
      3f04b1bb
    • Andrew MacLeod's avatar
      tree-ssa-loop.h: Remove include files. · e28030cf
      Andrew MacLeod authored
      
      	* tree-ssa-loop.h: Remove include files.
      	* gengtype.c (open_base_files): Adjust include list for gtype-desc.c.
      	* cfgloopmanip.c: Move required includes from tree-ssa-loop.h.
      	* graphite-clast-to-gimple.c: Likewise.
      	* graphite-scop-detection.c: Likewise.
      	* graphite-sese-to-poly.c: Likewise.
      	* ipa-inline-analysis.c: Likewise.
      	* ipa-pure-const.c: Likewise.
      	* loop-init.c: Likewise.
      	* passes.c: Likewise.
      	* predict.c: Likewise.
      	* tree-cfg.c: Likewise.
      	* tree-cfgcleanup.c: Likewise.
      	* tree-chrec.c: Likewise.
      	* tree-data-ref.c: Likewise.
      	* tree-loop-distribution.c: Likewise.
      	* tree-parloops.c: Likewise.
      	* tree-predcom.c: Likewise.
      	* tree-scalar-evolution.c: Likewise.
      	* tree-ssa-address.c: Likewise.
      	* tree-ssa.c: Likewise.
      	* tree-ssa-dce.c: Likewise.
      	* tree-ssa-loop.c: Likewise.
      	* tree-ssa-loop-im.c: Likewise.
      	* tree-ssa-loop-ivcanon.c: Likewise.
      	* tree-ssa-loop-ivopts.c: Likewise.
      	* tree-ssa-loop-manip.c: Likewise.
      	* tree-ssa-loop-niter.c: Likewise.
      	* tree-ssa-loop-prefetch.c: Likewise.
      	* tree-ssa-loop-unswitch.c: Likewise.
      	* tree-ssa-reassoc.c: Likewise.
      	* tree-vect-data-refs.c: Likewise.
      	* tree-vect-loop.c: Likewise.
      	* tree-vect-loop-manip.c: Likewise.
      	* tree-vectorizer.c: Likewise.
      	* tree-vect-stmts.c: Likewise.
      	* tree-vrp.c: Likewise.
      
      From-SVN: r203987
      e28030cf
    • Jason Merrill's avatar
      In C++11 a trivial [cd]tor might not be callable. · eca7fc57
      Jason Merrill authored
      	* class.c (user_provided_p): A function deleted on its declation
      	in the class is not user-provided.
      	(type_build_ctor_call): Also force a ctor call if we
      	might have a deleted or private trivial ctor.
      	(type_build_dtor_call): New.
      	(deduce_noexcept_on_destructors): Remove obsolete code.
      	* cp-tree.h: Declare type_build_dtor_call.
      	* decl.c (expand_static_init): Make sure trivial dtors are callable.
      	(cxx_maybe_build_cleanup): Likewise.
      	* except.c (build_throw): Likewise.
      	* init.c (build_value_init): Handle trivial but not callable ctors.
      	(perform_target_ctor): Make sure trivial dtor is callable.
      	(perform_member_init): Likewise.
      	(expand_cleanup_for_base): Likewise.
      	(build_vec_delete_1): Likewise.
      	(build_delete): Likewise.
      	(push_base_cleanups): Likewise.
      	(build_new_1): Avoid redundant error.
      	* method.c (synthesized_method_walk): Can't ever exit early in C++11.
      	Always process the subobject destructor.
      	* semantics.c (finish_compound_literal): Make sure trivial dtor is
      	callable.
      	* typeck2.c (split_nonconstant_init): Likewise.
      
      From-SVN: r203985
      eca7fc57
    • Jason Merrill's avatar
      d4c579b5
    • Bill Schmidt's avatar
      altivec.md (mulv8hi3): Adjust for little endian. · 24d2e5eb
      Bill Schmidt authored
      2013-10-23  Bill Schmidt  <wschmidt@linux.vnet.ibm.com>
      
      	* config/rs6000/altivec.md (mulv8hi3): Adjust for little endian.
      
      From-SVN: r203980
      24d2e5eb
    • Jakub Jelinek's avatar
      re PR tree-optimization/58775 (reassoc1 causes an ICE with some bool arithmetic) · 5e40da4f
      Jakub Jelinek authored
      	PR tree-optimization/58775
      	PR tree-optimization/58791
      	* tree-ssa-reassoc.c (reassoc_stmt_dominates_stmt_p): New function.
      	(insert_stmt_after): Rewritten, don't move the stmt, but really
      	insert it.
      	(get_stmt_uid_with_default): Remove.
      	(build_and_add_sum): Use insert_stmt_after and
      	reassoc_stmt_dominates_stmt_p.  Fix up uid if bb contains only
      	labels.
      	(update_range_test): Set uid on stmts added by
      	force_gimple_operand_gsi.  Don't immediately modify statements
      	in inter-bb optimization, just update oe->op values.
      	(optimize_range_tests): Return bool whether any changed have
      	been made.
      	(update_ops): New function.
      	(struct inter_bb_range_test_entry): New type.
      	(maybe_optimize_range_tests): Perform statement changes here.
      	(not_dominated_by, appears_later_in_bb, get_def_stmt,
      	ensure_ops_are_available): Remove.
      	(find_insert_point): Rewritten.
      	(rewrite_expr_tree): Remove MOVED argument, add CHANGED argument,
      	return LHS of the (new resp. old) stmt.  Don't call
      	ensure_ops_are_available, don't reuse SSA_NAMEs, recurse first
      	instead of last, move new stmt at the right place.
      	(linearize_expr, repropagate_negates): Don't reuse SSA_NAMEs.
      	(negate_value): Likewise.  Set uids.
      	(break_up_subtract_bb): Initialize uids.
      	(reassociate_bb): Adjust rewrite_expr_tree caller.
      	(do_reassoc): Don't call renumber_gimple_stmt_uids.
      
      	* gcc.dg/guality/pr58791-1.c: New test.
      	* gcc.dg/guality/pr58791-2.c: New test.
      	* gcc.dg/guality/pr58791-3.c: New test.
      	* gcc.dg/guality/pr58791-4.c: New test.
      	* gcc.dg/guality/pr58791-5.c: New test.
      	* gcc.c-torture/compile/pr58775.c: New test.
      	* gcc.dg/tree-ssa/reassoc-28.c: Don't scan reassoc1 dump.
      
      From-SVN: r203979
      5e40da4f
    • Paolo Carlini's avatar
      re PR libstdc++/58850 (Conversion error in chrono) · 66caf47a
      Paolo Carlini authored
      2013-10-23  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR libstdc++/58850
      	* include/std/chrono (minutes, hours): Change typedefs to uniformly
      	use int64_t.
      	* testsuite/20_util/duration/arithmetic/58850.cc: New.
      
      From-SVN: r203978
      66caf47a
    • David Edelsohn's avatar
      re PR target/58838 (mullw sets condition code incorrectly.) · 021b0410
      David Edelsohn authored
              PR target/58838
              * config/rs6000/rs6000.md (mulsi3_internal1 and splitter): Add
              TARGET_32BIT final condition.
              (mulsi3_internal2 and splitter): Same.
      
      From-SVN: r203977
      021b0410
    • Jeff Law's avatar
      tree-ssa-threadedge.c (thread_across_edge): Do not allow threading through... · b1149e84
      Jeff Law authored
      tree-ssa-threadedge.c (thread_across_edge): Do not allow threading through joiner blocks with abnormal outgoing edges.
      
      	* tree-ssa-threadedge.c (thread_across_edge): Do not allow threading
      	through joiner blocks with abnormal outgoing edges.
      
      	* tree-ssa-threadupdate.c (thread_block_1): Renamed from thread_block.
      	Add parameter JOINERS, to allow/disallow threading through joiner
      	blocks.
      	(thread_block): New.  Call thread_block_1.
      	(mark_threaded_blocks): Remove code to filter out certain cases
      	of threading through joiner blocks.
      	(thread_through_all_blocks): Document how we can have a dangling
      	edge AUX field and clear it.
      
      From-SVN: r203975
      b1149e84
    • Ian Lance Taylor's avatar
      invoke.texi (Option Summary): Remove -fno-default-inline. · c9edbc5f
      Ian Lance Taylor authored
      	* doc/invoke.texi (Option Summary): Remove -fno-default-inline.
      	(C++ Dialect Options): Likewise.
      	(Optimize Options): Likewise.
      
      From-SVN: r203974
      c9edbc5f
    • Tom de Vries's avatar
      Add missing check in stmt_local_def for tail-merge. · a63b68b2
      Tom de Vries authored
      2013-10-22  Tom de Vries  <tom@codesourcery.com>
      
      	PR tree-optimization/58805
      	* tree-ssa-tail-merge.c (stmt_local_def): Add gimple_vdef check.
      
      	* gcc.dg/pr58805.c: New test.
      
      From-SVN: r203973
      a63b68b2
    • Jakub Jelinek's avatar
      tree-vect-patterns.c (vect_recog_divmod_pattern): Optimize sequence based on... · 7abed779
      Jakub Jelinek authored
      tree-vect-patterns.c (vect_recog_divmod_pattern): Optimize sequence based on get_range_info returned range.
      
      	* tree-vect-patterns.c (vect_recog_divmod_pattern): Optimize
      	sequence based on get_range_info returned range.
      
      	* gcc.target/i386/vect-div-1.c: New test.
      
      From-SVN: r203969
      7abed779
    • Jakub Jelinek's avatar
      * gcc.dg/vect/pr58508.c: Remove dg-options. · 2d67d169
      Jakub Jelinek authored
      From-SVN: r203968
      2d67d169
Loading