Skip to content
Snippets Groups Projects
  1. Aug 21, 2010
    • Tobias Burnus's avatar
      re PR fortran/36158 (Transformational function BESSEL_YN(n1,n2,x) and BESSEL_JN missing) · 47b99694
      Tobias Burnus authored
      2010-08-21  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/36158
              PR fortran/33197
              * intrinsic.c (add_sym): Init value attribute.
              (set_attr_value): New function.
              (add_functions) Use it and add JN/YN resolvers.
              * symbol.c (gfc_copy_formal_args_intr): Copy value attr.
              * intrinsic.h (gfc_resolve_bessel_n2): New prototype.
              * gfortran.h (gfc_intrinsic_arg): Add value attribute.
              * iresolve.c (gfc_resolve_bessel_n2): New function.
              * trans-intrinsic.c (gfc_get_symbol_for_expr): Create
              formal arg list.
              (gfc_conv_intrinsic_function,gfc_is_intrinsic_libcall):
              Add GFC_ISYM_JN2/GFC_ISYM_YN2 as case value.
              * simplify.c (): For YN set to -INF if previous values
              was -INF.
              * trans-expr.c (gfc_conv_procedure_call): Don't crash
              if sym->as is NULL.
              * iresolve.c (gfc_resolve_extends_type_of): Set the
              type of the dummy argument to the one of the actual.
      
      2010-08-21  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/36158
              PR fortran/33197
              * m4/bessel.m4: Implement bessel_jn and bessel_yn.
              * gfortran.map: Add the generated bessel_jn_r{4,8,10,16}
              and bessel_yn_r{4,8,10,16}.
              * Makefile.am: Add bessel.m4.
              * Makefile.in: Regenerated.
              * generated/bessel_r4.c: Generated.
              * generated/bessel_r16.c: Generated.
              * generated/bessel_r8.c: Generated.
              * generated/bessel_r10.c: Generated.
      
      2010-08-21  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/36158
              PR fortran/33197
              * gfortran.dg/bessel_6.f90: New.
              * gfortran.dg/bessel_7.f90: New.
      
      From-SVN: r163440
      47b99694
    • Jan Hubicka's avatar
      re PR middle-end/45307 (Stores expanding to no RTL not removed by tree... · 508e4757
      Jan Hubicka authored
      re PR middle-end/45307 (Stores expanding to no RTL not removed by tree optimizers, Empty ctors/dtors not eliminated)
      
      
      	PR c++/45307
      	PR c++/17736
      	* cgraph.h (cgraph_only_called_directly_p,
      	cgraph_can_remove_if_no_direct_calls_and_refs_p): Handle
      	static cdtors.
      	* cgraphunit.c (cgraph_decide_is_function_needed): Static cdtors
      	are not needed.
      	(cgraph_finalize_function): Static cdtors are reachable.
      	(cgraph_mark_functions_to_output): Use cgraph_only_called_directly_p.
      
      	* gcc.dg/ipa/ctor-empty-1.c: Add testcase.
      	* g++.dg/tree-ssa/empty-2.C: Check that constructor got optimized out.
      
      From-SVN: r163439
      508e4757
    • Jan Hubicka's avatar
      lto-cgraph.c (lto_output_edge): Use gimple_has_body_p instead of flag_wpa. · f1395d4a
      Jan Hubicka authored
      	* lto-cgraph.c (lto_output_edge): Use gimple_has_body_p instead of flag_wpa.
      	* lto-streamer-out.c (lto_output): Likewise.
      	* passes.c (ipa_write_optimization_summaries): Initialize statement uids.
      	
      	* lto.c (lto_1_to_1_map): Be prepared for node to have no file data.
      	(lto_wpa_write_files): Update comments.
      
      From-SVN: r163438
      f1395d4a
    • GCC Administrator's avatar
      Daily bump. · 12523de0
      GCC Administrator authored
      From-SVN: r163437
      12523de0
  2. Aug 20, 2010
    • Maciej W. Rozycki's avatar
      pex-common.c (pex_read_err): Set stderr_pipe to -1 if a corresponding stream has been opened. · 93f36faa
      Maciej W. Rozycki authored
      	* pex-common.c (pex_read_err): Set stderr_pipe to -1 if a
      	corresponding stream has been opened.
      	(pex_free): Close pipe file descriptors corresponding to child's
      	stdout and stderr before waiting.
      
      From-SVN: r163426
      93f36faa
    • Olivier Hainque's avatar
      tree.h (alias_diag_flags): New enum. · b4d456ff
      Olivier Hainque authored
              * tree.h (alias_diag_flags): New enum.
              (alias_pair): Add an 'emitted_diags' field.
              * varasm.c (finish_aliases_1): Honor and update
              * p->emitted_diags.
              (assemble_alias): Initialize emitted_diags of new pairs.
      
      From-SVN: r163425
      b4d456ff
    • Eric Botcazou's avatar
      aix.h (STACK_CHECK_STATIC_BUILTIN): Define to 1. · 39acb18f
      Eric Botcazou authored
      	* config/rs6000/aix.h (STACK_CHECK_STATIC_BUILTIN): Define to 1.
      	* config/rs6000/linux.h (STACK_CHECK_STATIC_BUILTIN): Likewise.
      	* config/rs6000/linux64.h (STACK_CHECK_STATIC_BUILTIN): Likewise.
      	(STACK_CHECK_PROTECT): Define.
      	* config/rs6000/rs6000.c (rs6000_emit_probe_stack_range): New function.
      	(output_probe_stack_range): Likewise.
      	(rs6000_emit_prologue): Invoke rs6000_emit_probe_stack_range if static
      	builtin stack checking is enabled.
      	* config/rs6000/rs6000-protos.h (output_probe_stack_range): Declare.
      	* config/rs6000/rs6000.md (UNSPECV_PROBE_STACK_RANGE): New constant.
      	(probe_stack_range): New insn.
      
      From-SVN: r163424
      39acb18f
    • H.J. Lu's avatar
      Cast to unsigned short/char first for _mm_extract_epi16/_mm_extract_epi8. · 410841c6
      H.J. Lu authored
      gcc/
      
      2010-08-20  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR target/45336
      	* config/i386/emmintrin.h (_mm_extract_epi16): Cast to unsigned
      	short first.
      
      	* config/i386/smmintrin.h (_mm_extract_epi8): Cast to unsigned
      	char first.
      
      gcc/testsuite/
      
      2010-08-20  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR target/45336
      	* gcc.target/i386/pr45336-1.c: New.
      	* gcc.target/i386/pr45336-2.c: Likewise.
      	* gcc.target/i386/pr45336-3.c: Likewise.
      	* gcc.target/i386/pr45336-4.c: Likewise.
      
      From-SVN: r163421
      410841c6
    • Jakub Jelinek's avatar
      re PR target/45336 (pextr{b,w,d}, (worse than) redundant extensions) · 50d724a7
      Jakub Jelinek authored
      	PR target/45336
      	* config/i386/sse.md (*sse4_1_pextrb): Add SWI48 mode iterator
      	to cover zero extension into 64-bit register.
      	(*sse2_pextrw): Likewise.
      	(*sse4_1_pextrd_zext): New insn.
      
      From-SVN: r163420
      50d724a7
    • Iain Sandoe's avatar
      revert r163410, partially revert r163267. · c6d8116a
      Iain Sandoe authored
      	* config/rs6000/darwin.h (LIB_SPEC): Remove.
      	* config/darwin.h (REAL_LIBGCC_SPEC): Link lgcc for all 
      	Darwin versions.
      
      From-SVN: r163419
      c6d8116a
    • Uros Bizjak's avatar
      re PR testsuite/45361 (gcc.target/i386/volatile-2.c failed) · 26e4a417
      Uros Bizjak authored
      	PR testsuite/45361
      	* gcc.target/i386/volatile-2.c: Update scan strings to also
      	include (%rip) for the memory reference on x86_64.
      
      From-SVN: r163416
      26e4a417
    • Jakub Jelinek's avatar
      re PR middle-end/44974 (Function with attribute noreturn omits a call to... · 994fc9ab
      Jakub Jelinek authored
      re PR middle-end/44974 (Function with attribute noreturn omits a call to another function with noreturn)
      
      	PR middle-end/44974
      	* builtins.c (expand_builtin): Don't optimize away
      	calls to DECL_LOOPING_CONST_OR_PURE_P builtins.
      
      	* gcc.dg/pr44974.c: New test.
      
      From-SVN: r163415
      994fc9ab
    • Uros Bizjak's avatar
      i386.md (ashift RSP splitter): Remove splitter. · 6c334090
      Uros Bizjak authored
      	* config/i386/i386.md (ashift RSP splitter): Remove splitter.
      	(pro_epilogue_adjust_stack_di_2): Use "l" constraint for
      	alternative 1 of operand 2.
      
      From-SVN: r163414
      6c334090
    • Jakub Jelinek's avatar
      simplify-rtx.c (simplify_unary_operation_1): Optimize (sign_extend... · 561da6bc
      Jakub Jelinek authored
      simplify-rtx.c (simplify_unary_operation_1): Optimize (sign_extend (zero_extend ()) and ({sign,zero}_extend (lshiftrt...
      
      	* simplify-rtx.c (simplify_unary_operation_1): Optimize
      	(sign_extend (zero_extend ()) and
      	({sign,zero}_extend (lshiftrt (ashift X (const_int I)) (const_int I))).
      
      Co-Authored-By: default avatarPaolo Bonzini <bonzini@gnu.org>
      
      From-SVN: r163413
      561da6bc
    • Jakub Jelinek's avatar
      re PR rtl-optimization/45353 (ICE: RTL check: expected elt 3 type 'B', have... · 89ad0f25
      Jakub Jelinek authored
      re PR rtl-optimization/45353 (ICE: RTL check: expected elt 3 type 'B', have '0' (rtx barrier) in sel_bb_head, at sel-sched-ir.c:4329 with -fselective-scheduling and __builtin_unreachable())
      
      	PR rtl-optimization/45353
      	* sel-sched-ir.c (sel_bb_head): Return NULL even if next_nonnote_insn
      	after bb_note is a BARRIER.
      
      	* gcc.dg/pr45353.c: New test.
      
      From-SVN: r163412
      89ad0f25
    • Iain Sandoe's avatar
      darwin.h (LIB_SPEC): New. · bf794e41
      Iain Sandoe authored
      	* config/rs6000/darwin.h (LIB_SPEC): New. Provide save/restFP by 
      	linking libgcc.a.
      
      From-SVN: r163410
      bf794e41
    • Jakub Jelinek's avatar
      tree-ssa-address.c (tree_mem_ref_addr): Convert offset to sizetype. · 521fdcda
      Jakub Jelinek authored
      
      	* tree-ssa-address.c (tree_mem_ref_addr): Convert offset to
      	sizetype.
      
      Co-Authored-By: default avatarMichael Matz <matz@suse.de>
      
      From-SVN: r163409
      521fdcda
    • Joseph Myers's avatar
      * lang.opt (MD, MMD): Use NoDriverArg instead of NoArgDriver. · ca865c2b
      Joseph Myers authored
      From-SVN: r163408
      ca865c2b
    • Nathan Froyd's avatar
      ggc-common.c (ggc_mark_root_tab): New function, split out from... · 71bb2d86
      Nathan Froyd authored
      	* ggc-common.c (ggc_mark_root_tab): New function, split out from...
      	(ggc_mark_roots): ...here.
      
      From-SVN: r163407
      71bb2d86
    • Joseph Myers's avatar
      gfortranspec.c (lang_specific_driver): Refer to -lgfortran in comment, not -lg2c. · 1d4d9588
      Joseph Myers authored
      	* gfortranspec.c (lang_specific_driver): Refer to -lgfortran in
      	comment, not -lg2c.
      
      From-SVN: r163406
      1d4d9588
    • H.J. Lu's avatar
      Replace has_analyzed_clone with has_analyzed_clone_p. · 2429bce3
      H.J. Lu authored
      2010-08-20  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR bootstrap/45357
      	* lto.c (lto_materialize_function): Replace has_analyzed_clone
      	with has_analyzed_clone_p.
      
      From-SVN: r163405
      2429bce3
    • Jan Hubicka's avatar
      lto.c (has_analyzed_clone_p): New function · e0f967db
      Jan Hubicka authored
      	* lto.c (has_analyzed_clone_p): New function
      	(lto_materialize_function): Use callgraph to determine if
      	body is needed.
      	(materialize_cgraph): Remove DECL_IS_BUILTIN check.
      
      From-SVN: r163403
      e0f967db
    • Nathan Sidwell's avatar
      missed from rest of commit · 1f5a46fe
      Nathan Sidwell authored
      missed from rest of commit
      	* gimplify.c (gimplify_modify_expr): When assigning to volatiles,
      	copy the src value and return a copy.
      	* doc/extend.texi (Volatiles): Move from C++ to C and expand.
      	(C++ Volatiles): Adjust to describe C++ semantics only.
      
      From-SVN: r163402
      1f5a46fe
    • Nathan Froyd's avatar
      vec.h (FOR_EACH_VEC_ELT): Define. · ac47786e
      Nathan Froyd authored
      gcc/
      	* vec.h (FOR_EACH_VEC_ELT): Define.
      	* c-decl.c: Use it.
      	* cfgloop.c: Likewise.
      	* cfgloopmanip.c: Likewise.
      	* cgraph.c: Likewise.
      	* cgraphunit.c: Likewise.
      	* combine.c: Likewise.
      	* config/bfin/bfin.c: Likewise.
      	* config/mips/mips.c: Likewise.
      	* config/rs6000/rs6000.c: Likewise.
      	* dbxout.c: Likewise.
      	* df-scan.c: Likewise.
      	* dominance.c: Likewise.
      	* dse.c: Likewise.
      	* dwarf2out.c: Likewise.
      	* except.c: Likewise.
      	* expr.c: Likewise.
      	* function.c: Likewise.
      	* gcse.c: Likewise.
      	* genattr.c: Likewise.
      	* ggc-common.c: Likewise.
      	* gimplify.c: Likewise.
      	* graphite-blocking.c: Likewise.
      	* graphite-clast-to-gimple.c: Likewise.
      	* graphite-dependences.c: Likewise.
      	* graphite-interchange.c: Likewise.
      	* graphite-poly.c: Likewise.
      	* graphite-scop-detection.c: Likewise.
      	* graphite-sese-to-poly.c: Likewise.
      	* graphite.c: Likewise.
      	* haifa-sched.c: Likewise.
      	* ifcvt.c: Likewise.
      	* implicit-zee.c: Likewise.
      	* ipa-prop.c: Likewise.
      	* ipa-struct-reorg.c: Likewise.
      	* ipa.c: Likewise.
      	* ira-build.c: Likewise.
      	* ira-color.c: Likewise.
      	* ira-emit.c: Likewise.
      	* lambda-code.c: Likewise.
      	* loop-invariant.c: Likewise.
      	* loop-unroll.c: Likewise.
      	* lower-subreg.c: Likewise.
      	* lto-cgraph.c: Likewise.
      	* lto-opts.c: Likewise.
      	* lto-streamer-in.c: Likewise.
      	* lto-streamer-out.c: Likewise.
      	* lto-streamer.c: Likewise.
      	* lto-symtab.c: Likewise.
      	* matrix-reorg.c: Likewise.
      	* opts.c: Likewise.
      	* predict.c: Likewise.
      	* print-tree.c: Likewise.
      	* sdbout.c: Likewise.
      	* sel-sched-dump.c: Likewise.
      	* sel-sched-ir.c: Likewise.
      	* sel-sched.c: Likewise.
      	* sese.c: Likewise.
      	* stor-layout.c: Likewise.
      	* tree-cfg.c: Likewise.
      	* tree-cfgcleanup.c: Likewise.
      	* tree-chrec.c: Likewise.
      	* tree-data-ref.c: Likewise.
      	* tree-emutls.c: Likewise.
      	* tree-inline.c: Likewise.
      	* tree-into-ssa.c: Likewise.
      	* tree-loop-distribution.c: Likewise.
      	* tree-loop-linear.c: Likewise.
      	* tree-mudflap.c: Likewise.
      	* tree-outof-ssa.c: Likewise.
      	* tree-parloops.c: Likewise.
      	* tree-predcom.c: Likewise.
      	* tree-pretty-print.c: Likewise.
      	* tree-scalar-evolution.c: Likewise.
      	* tree-ssa-live.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-phiprop.c: Likewise.
      	* tree-ssa-pre.c: Likewise.
      	* tree-ssa-reassoc.c: Likewise.
      	* tree-ssa-sccvn.c: Likewise.
      	* tree-ssa-structalias.c: Likewise.
      	* tree-ssa.c: Likewise.
      	* tree-vect-data-refs.c: Likewise.
      	* tree-vect-loop-manip.c: Likewise.
      	* tree-vect-loop.c: Likewise.
      	* tree-vect-patterns.c: Likewise.
      	* tree-vect-slp.c: Likewise.
      	* tree-vect-stmts.c: Likewise.
      	* tree-vrp.c: Likewise.
      	* tree.c: Likewise.
      	* value-prof.c: Likewise.
      	* var-tracking.c: Likewise.
      	* varasm.c: Likewise.
      	* vmsdbgout.c: Likewise.
      
      gcc/ada/
      	* gcc-interface/decl.c: Use FOR_EACH_VEC_ELT.
      	* gcc-interface/trans.c: Likewise.
      	* gcc-interface/utils.c: Likewise.
      
      gcc/c-family/
      	* c-common.c: Use FOR_EACH_VEC_ELT.
      	* c-gimplify.c: Likewise.
      	* c-pragma.c: Likewise.
      
      gcc/cp/
      	* call.c: Use FOR_EACH_VEC_ELT.
      	* class.c: Likewise.
      	* decl.c: Likewise.
      	* decl2.c: Likewise.
      	* error.c: Likewise.
      	* except.c: Likewise.
      	* mangle.c: Likewise.
      	* method.c: Likewise.
      	* name-lookup.c: Likewise.
      	* parser.c: Likewise.
      	* pt.c: Likewise.
      	* repo.c: Likewise.
      	* semantics.c: Likewise.
      	* typeck2.c: Likewise.
      
      gcc/fortran/
      	* trans-openmp.c: Use FOR_EACH_VEC_ELT.
      
      gcc/java/
      	* class.c: Use FOR_EACH_VEC_ELT.
      	* expr.c: Likewise.
      	* jcf-parse.c: Likewise.
      	* resource.c: Likewise.
      
      gcc/lto/
      	* lto.c: Use FOR_EACH_VEC_ELT.
      
      From-SVN: r163401
      ac47786e
    • Nathan Sidwell's avatar
      gimplify.c (gimplify_modify_expr): When assigning to volatiles, copy the src... · 8f0fe813
      Nathan Sidwell authored
      gimplify.c (gimplify_modify_expr): When assigning to volatiles, copy the src value and return a copy.
      
      	gcc/
      	* gimplify.c (gimplify_modify_expr): When assigning to volatiles,
      	copy the src value and return a copy.
      	* doc/extend.texi (Volatiles): Move from C++ to C and expand.
      	(C++ Volatiles): Adjust to describe C++ semantics only.
      
      	gcc/testsuite/
      	* gcc.target/i386/volatile-2.c: New.
      
      From-SVN: r163400
      8f0fe813
    • Joseph Myers's avatar
      tm.texi.in (PIC_OFFSET_TABLE_REG_CALL_CLOBBERED): Document to be zero or nonzero. · f8fe0a4a
      Joseph Myers authored
      2010-08-20  Joseph Myers  <joseph@codesourcery.com>
      
      	gcc/
      	* doc/tm.texi.in (PIC_OFFSET_TABLE_REG_CALL_CLOBBERED): Document to
      	be zero or nonzero.
      	* doc/tm.texi: Regenerate.
      	* defaults.h (PIC_OFFSET_TABLE_REG_CALL_CLOBBERED): Define.
      	* df-scan.c (df_get_exit_block_use_set), reginfo.c
      	(init_reg_sets_1), rtlanal.c (rtx_unstable_p, rtx_varies_p):
      	Handle new PIC_OFFSET_TABLE_REG_CALL_CLOBBERED semantics.
      	* config/ia64/ia64.h (PIC_OFFSET_TABLE_REG_CALL_CLOBBERED): Define
      	to 1.
      
      From-SVN: r163399
      f8fe0a4a
    • Andrey Belevantsev's avatar
      re PR rtl-optimization/44691 (ICE: RTL check: expected code 'reg', have 'plus'... · 46499993
      Andrey Belevantsev authored
      re PR rtl-optimization/44691 (ICE: RTL check: expected code 'reg', have 'plus' in rhs_regno, at rtl.h:1050)
      
              PR rtl-optimization/44691
              * gfortran.dg/pr44691.f: New test.
      
      From-SVN: r163396
      46499993
    • Olivier Hainque's avatar
      sparc.c (sparc_asm_function_epilogue): Don't output an extra nop past a... · 891aa2ec
      Olivier Hainque authored
      sparc.c (sparc_asm_function_epilogue): Don't output an extra nop past a sibling call at the very end.
      
              * config/sparc/sparc.c (sparc_asm_function_epilogue): Don't output
              an extra nop past a sibling call at the very end.
      
              testsuite/
              * gcc.target/sparc/sibcall-dslot.c: New testcase.
      
      From-SVN: r163395
      891aa2ec
    • Uros Bizjak's avatar
      pass41-frag.cxx (dg-prune-output): New dg directive. · 07d5b925
      Uros Bizjak authored
      	* testsuite/libmudflap.c++/pass41-frag.cxx (dg-prune-output):
      	New dg directive.
      
      From-SVN: r163394
      07d5b925
    • GCC Administrator's avatar
      Daily bump. · d81c4d4c
      GCC Administrator authored
      From-SVN: r163393
      d81c4d4c
  3. Aug 19, 2010
    • Bernd Schmidt's avatar
      re PR bootstrap/45350 (Failed to bootstrap on Linux/ia64) · b98425da
      Bernd Schmidt authored
      	PR bootstrap/45350
      	* combine.c (try_combine): Initialize i1_is_used and i2_is_used.  Fix
      	a comment.
      
      From-SVN: r163389
      b98425da
    • Jerry DeLisle's avatar
      re PR fortran/45108 (Namelist read: Not aborted when reading from STDIN) · e1721879
      Jerry DeLisle authored
      2010-08-19  Jerry DeLisle  <jvdelisle@gcc.gnu.org>
      
      	PR libfortran/45108
      	* io/list_read.c (namelist_read): If namelist reading fails, use
      	generate_error and then continue the read loop.
      
      From-SVN: r163387
      e1721879
    • Nathan Froyd's avatar
      target.def (function_arg, [...]): Remove const qualifier on CUMULATIVE_ARGS parameter. · 29e88142
      Nathan Froyd authored
      	* target.def (function_arg, function_incoming_arg): Remove const
      	qualifier on CUMULATIVE_ARGS parameter.
      	* targhooks.h (default_function_arg, default_function_incoming_arg):
      	Likewise.
      	* targhooks.c (default_function_arg, default_function_incoming_arg):
      	Likewise.
      	* config/i386/i386.c (ix86_function_arg): Likewise.
      
      From-SVN: r163386
      29e88142
    • Jakub Jelinek's avatar
      re PR target/45336 (pextr{b,w,d}, (worse than) redundant extensions) · a5d8253f
      Jakub Jelinek authored
      	PR target/45336
      	* simplify-rtx.c (simplify_unary_operation_1): Optimize nested
      	SIGN_EXTENDs or ZERO_EXTENDs.
      
      From-SVN: r163384
      a5d8253f
    • Bernd Schmidt's avatar
      re PR tree-optimization/42172 (inefficient bit fields assignments) · 0524d2d6
      Bernd Schmidt authored
      	PR target/42172
      	* combine.c (combine_validate_cost): New arg I0.  All callers changed.
      	Take its cost into account if nonnull.
      	(insn_a_feeds_b): New static function.
      	(combine_instructions): Look for four-insn combinations.
      	(can_combine_p): New args PRED2, SUCC2.  All callers changed.  Take
      	them into account when computing all_adjacent and looking for other
      	uses.
      	(combinable_i3pat): New args I0DEST, I0_NOT_IN_SRC.  All callers
      	changed.  Treat them like I1DEST and I1_NOT_IN_SRC.
      	(try_combine): New arg I0.  Handle four-insn combinations.
      	(distribute_notes): New arg ELIM_I0.  All callers changed.  Treat it
      	like ELIM_I1.
      
      From-SVN: r163383
      0524d2d6
    • Jason Merrill's avatar
      call.c (reference_related_p): Check for error_mark_node. · f0d9b836
      Jason Merrill authored
      	* call.c (reference_related_p): Check for error_mark_node.
      	(add_function_candidate): Check it instead of
      	same_type_ignoring_top_level_qualifiers_p.
      
      From-SVN: r163382
      f0d9b836
    • Jason Merrill's avatar
      re PR c++/45315 (ICE: tree check: expected aggr_init_expr, have call_expr in... · 95d7bdaa
      Jason Merrill authored
      re PR c++/45315 (ICE: tree check: expected aggr_init_expr, have call_expr in build_value_init, at cp/init.c:317)
      
      	PR c++/45315
      	* init.c (build_new_1): Don't use build_value_init in a template.
      	(build_value_init): Make sure we don't.
      
      From-SVN: r163381
      95d7bdaa
    • Jason Merrill's avatar
      re PR middle-end/45307 (Stores expanding to no RTL not removed by tree... · ce3beba3
      Jason Merrill authored
      re PR middle-end/45307 (Stores expanding to no RTL not removed by tree optimizers, Empty ctors/dtors not eliminated)
      
      	PR c++/45307
      	* gimplify.c (gimplify_init_constructor): Just return GS_UNHANDLED
      	if ctor is empty.
      	(gimplify_modify_expr_rhs): Adjust.
      
      From-SVN: r163380
      ce3beba3
    • Jason Merrill's avatar
      except.c (pending_noexcept, [...]): New. · 2c5df20f
      Jason Merrill authored
      	* except.c (pending_noexcept, pending_noexcept_checks): New.
      	(perform_deferred_noexcept_checks): New.
      	(maybe_noexcept_warning): Split from...
      	(finish_noexcept_expr): ...here.  Adjust.
      	* decl2.c (cp_write_global_declarations): Call
      	perform_deferred_noexcept_checks.
      	* cp-tree.h: And declare it.
      
      From-SVN: r163379
      2c5df20f
    • Nathan Froyd's avatar
      cfgloop.c (get_loop_body_in_bfs_order): Avoid redundant call to bitmap_bit_p. · fcaa4ca4
      Nathan Froyd authored
      	* cfgloop.c (get_loop_body_in_bfs_order): Avoid redundant call to
      	bitmap_bit_p.
      	* config/bfin/bifn.c (bfin_discover_loop): Likewise.
      	* dominance.c (iterate_fix_dominators): Likewise.
      	* dse.c (set_usage_bits): Likewise.
      	(set_position_unneeded, record_store): Likewise.
      	* gimple-fold.c (get_maxval_strlen): Likewise.
      	* haifa-sched.c (fix_inter_tick, fix_recovery_deps): Likewise.
      	* ipa-inline.c (update_caller_keys): Likewise.
      	* ipa-split.c (verify_non_ssa_vars): Likewise.
      	* ipa-type-escape.c (mark_type, close_type_seen): Likewise.
      	(close_type_exposed_parameter, close_type_full_escape): Likewise.
      	(close_addressof_down): Likewise.
      	* ira-color.c (assign_hard_reg, push_allocno_to_stack): Likewise.
      	(setup_allocno_left_conflicts_size): Likewise.
      	(ira_reassign_conflict_allocnos): Likewise.
      	(ira_reassign_pseudos): Likewise.
      	* ira-emit.c (change_loop): Likewise.
      	* loop-invariant.c (mark_regno_live, mark_regno_death): Likewise.
      	* lto-streamer-out.c (write_symbol): Likewise.
      	* predict.c (expr_expected_value_1): Likewise.
      	* regstat.c (regstat_bb_compute_ri): Likewise.
      	* sel-sched.c (create_block_for_bookkeeping): Likewise.
      	(track_scheduled_insns_and_blocks, sel_sched_region_1): Likewise.
      	* stmt.c (expand_case): Likewise.
      	* tree-eh.c (emit_eh_dispatch): Likewise.
      	* tree-into-ssa.c (prune_unused_phi_nodes): Likewise.
      	* tree-loop-distribution.c (make_nodes_having_upstream_mem_writes):
      	Likewise.
      	(rdg_flag_vertex, rdg_flag_loop_exits): Likewise.
      	(rdg_build_components): Likewise.
      	* tree-object-size.c (collect_object_sizes_for): Likewise.
      	* tree-sra.c (convert_callers): Likewise.
      	* tree-ssa-coalesce.c (live_track_add_partition): Likewise.
      	* tree-ssa-live.c (mark_all_vars_used_1): Likewise.
      	* tree-ssa-pre.c (bitmap_set_replace_value): Likewise.
      
      From-SVN: r163378
      fcaa4ca4
Loading