Skip to content
Snippets Groups Projects
  1. Apr 16, 2010
    • Joseph Myers's avatar
      * crontab: Enable 4.6 snapshots. · 58ad2aef
      Joseph Myers authored
      From-SVN: r158434
      58ad2aef
    • Jakub Jelinek's avatar
      re PR debug/43762 (VLA artificial length var loclist is missing DW_OP_stack_value) · 835eb810
      Jakub Jelinek authored
      	PR debug/43762
      	* dwarf2out.c (add_bound_info): Always call loc_list_from_tree
      	with want_address 2 and in case a single element list might be
      	possible, call it again with want_address 0.
      
      From-SVN: r158430
      835eb810
    • Kaushik Phatak's avatar
      predicate.md (bit_operand): Allow immediate values that satisfy 'U' constraint. · db624ecb
      Kaushik Phatak authored
      2010-04-12  Kaushik Phatak<kaushik.phatak@kpitcummins.com>
      
       	* config/h8300/predicate.md (bit_operand): Allow immediate values that
       	satisfy 'U' constraint.
      
      From-SVN: r158429
      db624ecb
    • Eric Botcazou's avatar
      gigi.h (gnat_init_decl_processing): Delete. · 86060344
      Eric Botcazou authored
      	* gcc-interface/gigi.h (gnat_init_decl_processing): Delete.
      	* gcc-interface/decl.c (gnat_to_gnu_entity): Constify a few variables.
      	<object>: Do not create the fake PARM_DECL if no debug info is needed.
      	Do not create the corresponding VAR_DECL of a CONST_DECL for debugging
      	purposes if no debug info is needed.
      	Fix formatting.  Reorder and add comments.
      	* gcc-interface/trans.c (gnat_to_gnu) <N_Attribute_Reference>: Constify
      	variable and remove obsolete comment.
      	* gcc-interface/utils.c (convert_vms_descriptor64): Tweak comment.
      	(convert_vms_descriptor32): Likewise.
      	(convert): Remove dead code.
      	<UNCONSTRAINED_ARRAY_REF>: Pass the field instead of its name to build
      	the reference to the P_ARRAY pointer.
      	<POINTER_TYPE>: Likewise.
      	(maybe_unconstrained_array) <UNCONSTRAINED_ARRAY_TYPE>: Likewise.
      	(gnat_init_decl_processing): Delete, move contents to...
      	* gcc-interface/misc.c (gnat_init): ...here.
      
      From-SVN: r158428
      86060344
    • Joseph Myers's avatar
      be.po, [...]: Update. · 9b04d6de
      Joseph Myers authored
      	* be.po, ca.po, da.po, de.po, el.po, es.po, fr.po, id.po, ja.po,
      	nl.po, sv.po, tr.po, uk,po, vi.po, zh_CN.po, zh_TW.po: Update.
      
      From-SVN: r158426
      9b04d6de
    • Joseph Myers's avatar
      be.po, [...]: Update. · 54c61d77
      Joseph Myers authored
      	* be.po, da.po, de.po, el.po, es.po, fi.po, fr.po, id.po, ja.po,
      	nl.po, ru.po, sr.po, sv.po, tr.po, zh_CN.po, zh_TW.po: Update.
      
      From-SVN: r158424
      54c61d77
    • Rainer Orth's avatar
      configure.ac: Check for elf_getshdrstrndx or elf_getshstrndx separately. · 8ccb78f2
      Rainer Orth authored
      	toplevel:
      	* configure.ac: Check for elf_getshdrstrndx or elf_getshstrndx
      	separately.
      	* configure: Regenerate.
      
      	gcc:
      	* configure.ac: Check for elf_getshdrstrndx or elf_getshstrndx
      	flavor.
      	* configure: Regenerate.
      	* config.in: Regenerate.
      	* doc/install.texi (Prerequisites): Document that Solaris 2 libelf
      	works.
      
      	gcc/lto:
      	* lto-elf.c [!HAVE_ELF_GETSHDRSTRNDX] (elf_getshdrstrndx): New
      	function.
      
      From-SVN: r158423
      8ccb78f2
    • Richard Guenther's avatar
      tree.h (struct tree_decl_minimal): Move pt_uid ... · bc9c331d
      Richard Guenther authored
      2010-04-16  Richard Guenther  <rguenther@suse.de>
      
      	* tree.h (struct tree_decl_minimal): Move pt_uid ...
      	(struct tree_decl_common): ... here.
      	(DECL_PT_UID): Adjust.
      	(SET_DECL_PT_UID): Likewise.
      	(DECL_PT_UID_SET_P): Likewise.
      
      From-SVN: r158421
      bc9c331d
    • Richard Guenther's avatar
      re PR tree-optimization/43572 (FAIL: gfortran.dg/PR19872.f execution test;... · 12de6355
      Richard Guenther authored
      re PR tree-optimization/43572 (FAIL: gfortran.dg/PR19872.f execution test; formatted read - wrong numbers)
      
      2010-04-16  Richard Guenther  <rguenther@suse.de>
      
      	PR tree-optimization/43572
      	* tree-ssa-alias.h (call_may_clobber_ref_p): Declare.
      	* tree-ssa-alias.c (call_may_clobber_ref_p): Export.
      	* tree-flow.h (is_call_clobbered): Remove.
      	* tree-flow-inline.h (is_call_clobbered): Likewise.
      	* tree-dfa.c (dump_variable): Do not dump call clobber state.
      	* tree-nrv.c (dest_safe_for_nrv_p): Use the alias oracle.
      	(execute_return_slot_opt): Adjust.
      	* tree-tailcall.c (suitable_for_tail_opt_p): Remove
      	check for call clobbered vars here.
      	(find_tail_calls): Move tailcall verification to the
      	proper place.
      
      	* gcc.dg/tree-ssa/tailcall-5.c: New testcase.
      
      From-SVN: r158418
      12de6355
    • Diego Novillo's avatar
      Fixed ChangeLog entry. · 6ab643b5
      Diego Novillo authored
      From-SVN: r158416
      6ab643b5
    • Diego Novillo's avatar
      typo fix · b8360603
      Diego Novillo authored
      From-SVN: r158415
      b8360603
    • Diego Novillo's avatar
      rephrase text · 5074f576
      Diego Novillo authored
      From-SVN: r158414
      5074f576
    • Diego Novillo's avatar
      Clarify what happens with an unrecognized -Wno- option · e54655a2
      Diego Novillo authored
      From-SVN: r158413
      e54655a2
    • Eric Botcazou's avatar
      trans.c (unchecked_conversion_nop): Handle function calls. · 68a3eb69
      Eric Botcazou authored
      	* gcc-interface/trans.c (unchecked_conversion_nop): Handle function
      	calls.  Return true for conversion from a record subtype to its type.
      
      From-SVN: r158412
      68a3eb69
    • Eric Botcazou's avatar
      decl.c (gnat_to_gnu_entity): Use boolean_type_node in lieu of... · 1139f2e8
      Eric Botcazou authored
      decl.c (gnat_to_gnu_entity): Use boolean_type_node in lieu of integer_type_node for boolean operations.
      
      	* gcc-interface/decl.c (gnat_to_gnu_entity): Use boolean_type_node in
      	lieu of integer_type_node for boolean operations.
      	(choices_to_gnu): Likewise.
      	* gcc-interface/trans.c (Attribute_to_gnu): Likewise.
      	(Loop_Statement_to_gnu): Likewise.
      	(establish_gnat_vms_condition_handler): Likewise.
      	(Exception_Handler_to_gnu_sjlj): Likewise.
      	(gnat_to_gnu): Likewise.
      	(build_unary_op_trapv): Likewise.
      	(build_binary_op_trapv): Likewise.
      	(emit_range_check): Likewise.
      	(emit_index_check): Likewise.
      	(convert_with_check): Likewise.
      	* gcc-interface/utils.c (convert_vms_descriptor64): Likewise.
      	(convert_vms_descriptor32): Likewise.
      	(convert_vms_descriptor): Likewise.
      	* gcc-interface/utils2.c (nonbinary_modular_operation): Likewise.
      	(compare_arrays): Use boolean instead of integer constants.
      	(build_binary_op) <TRUTH_ANDIF_EXPR, TRUTH_ORIF_EXPR, TRUTH_AND_EXPR,
      	TRUTH_OR_EXPR, TRUTH_XOR_EXPR>: New case.  Check that the result type
      	is a boolean type.
      	<GE_EXPR, LE_EXPR, GT_EXPR, LT_EXPR>: Remove obsolete assertion.
      	<EQ_EXPR, NE_EXPR>: Check that the result type is a boolean type.
      	<PREINC/PREDECREMENT_EXPR, POSTINC/POSTDECREMENT_EXPR>: Delete.
      	<TRUTH_NOT_EXPR>: Check that the result type is a boolean type.
      	(build_unary_op): Use boolean_type_node in lieu of integer_type_node
      	for boolean operations.
      	(fill_vms_descriptor): Likewise.  Fix formatting nits.
      
      From-SVN: r158411
      1139f2e8
    • Eric Botcazou's avatar
      ada-tree.def (LOOP_STMT): Change to 4-operand nodes. · d88bbbb9
      Eric Botcazou authored
      	* gcc-interface/ada-tree.def (LOOP_STMT): Change to 4-operand nodes.
      	* gcc-interface/ada-tree.h (LOOP_STMT_TOP_COND, LOOP_STMT_BOT_COND):
      	Merge into...
      	(LOOP_STMT_COND): ...this.
      	(LOOP_STMT_BOTTOM_COND_P): New flag.
      	(LOOP_STMT_TOP_UPDATE_P): Likewise.
      	* gcc-interface/trans.c (can_equal_min_or_max_val_p): New function.
      	(can_equal_min_val_p): New static inline function.
      	(can_equal_max_val_p): Likewise.
      	(Loop_Statement_to_gnu): Use build4 in lieu of build5 and adjust to
      	new LOOP_STMT semantics.  Use two different strategies depending on
      	whether optimization is enabled to translate the loop.
      	(gnat_gimplify_stmt) <LOOP_STMT>: Adjust to new LOOP_STMT semantics.
      
      From-SVN: r158410
      d88bbbb9
    • Eric Botcazou's avatar
      uintp.adb (UI_From_Dint): Remove useless code. · 586388fd
      Eric Botcazou authored
      	* uintp.adb (UI_From_Dint): Remove useless code.
      	(UI_From_Int): Likewise.
      	* uintp.h: Reorder declarations.
      	(UI_From_gnu): Declare.
      	(UI_Base): Likewise.
      	(Vector_Template): Likewise.
      	(Vector_To_Uint): Likewise.
      	(Uint_0): Remove.
      	(Uint_1): Likewise.
      	* gcc-interface/gigi.h: Tweak comments.
      	* gcc-interface/cuintp.c (UI_From_gnu): New global function.
      	* gcc-interface/decl.c (maybe_pad_type): Do not warn if either size
      	overflows.
      	(annotate_value) <INTEGER_CST>: Call UI_From_gnu.
      	* gcc-interface/trans.c (post_error_ne_num): Call post_error_ne.
      	(post_error_ne_tree): Call UI_From_gnu and post_error_ne.
      	* gcc-interface/utils.c (max_size) <tcc_binary>: Do not special-case
      	TYPE_MAX_VALUE.
      
      From-SVN: r158408
      586388fd
    • Bernd Schmidt's avatar
      re PR target/40603 (unnecessary conversion from unsigned byte load to signed byte load) · f0c6475a
      Bernd Schmidt authored
      	PR target/40603
      	* config/arm/arm.md (cbranchqi4): New pattern.
      	* config/arm/predicates.md (const0_operand,
      	cbranchqi4_comparison_operator): New predicates.
      
      	PR target/40603
      	* gcc.target/arm/thumb-cbranchqi.c: New test.
      
      From-SVN: r158407
      f0c6475a
    • Richard Guenther's avatar
      gimple-pretty-print.c (dump_gimple_phi): Dump alias info. · f0107145
      Richard Guenther authored
      2010-04-16  Richard Guenther  <rguenther@suse.de>
      
      	* gimple-pretty-print.c (dump_gimple_phi): Dump alias info.
      	(dump_gimple_stmt): Likewise.
      
      From-SVN: r158406
      f0107145
    • Bernd Schmidt's avatar
      arm.md (addsi3_cbranch): If destination is a high register... · 3302cfa1
      Bernd Schmidt authored
      	* config/arm/arm.md (addsi3_cbranch): If destination is a high
      	register, inputs must be low registers and we need a low register
      	scratch.  Handle alternative 2 like alternative 3.
      
      From-SVN: r158405
      3302cfa1
    • Bernd Schmidt's avatar
      re PR target/41514 (redundant compare instruction of consecutive conditional branches) · 6ea007e4
      Bernd Schmidt authored
      	PR target/41514
      	* config/arm/arm.md (cbranchsi4_insn): Renamed from "*cbranchsi4_insn".
      	If the previous insn is a cbranchsi4_insn with the same arguments,
      	omit the compare instruction.
      
      	PR target/41514
      	gcc.target/arm/thumb-comparisons.c: New test.
      
      From-SVN: r158404
      6ea007e4
    • Bernd Schmidt's avatar
      recog.h (struct recog_data): New field is_operator. · 6ddfdb0f
      Bernd Schmidt authored
      	* recog.h (struct recog_data): New field is_operator.
      	(struct insn_operand_data): New field is_operator.
      	* recog.c (extract_insn): Set recog_data.is_operator.
      	* genoutput.c (output_operand_data): Emit code to set the
      	is_operator field.
      	* reload.c (find_reloads): Use it rather than testing for an
      	empty constraint string.
      
      From-SVN: r158403
      6ddfdb0f
    • Jakub Jelinek's avatar
      alias.c (memrefs_conflict_p): If x and y are the same VALUE, don't call get_addr on both. · 5312b066
      Jakub Jelinek authored
      	* alias.c (memrefs_conflict_p): If x and y are the same VALUE,
      	don't call get_addr on both.  If one expression is a VALUE and
      	the other a REG, check VALUE's locs if the REG isn't among them.
      
      From-SVN: r158401
      5312b066
    • Kevin Williams's avatar
      * MAINTAINERS (Write After Approval): Add myself. · d5cc2ee3
      Kevin Williams authored
      From-SVN: r158400
      d5cc2ee3
    • Christian Bruel's avatar
      add accumulate-outgoing-args and omit-frame-pointer for SH · 7a296495
      Christian Bruel authored
      From-SVN: r158399
      7a296495
    • Eric Botcazou's avatar
      decl.c (make_type_from_size): Just copy TYPE_NAME. · 169afcb9
      Eric Botcazou authored
      	* gcc-interface/decl.c (make_type_from_size) <INTEGER_TYPE>: Just copy
      	TYPE_NAME.
      	* gcc-interface/trans.c (smaller_packable_type_p): Rename into...
      	(smaller_form_type_p): ...this.  Change parameter and variable names.
      	(call_to_gnu): Use the nominal type of the parameter to create the
      	temporary if it's a smaller form of the actual type.
      	(addressable_p): Return false if the actual type is integral and its
      	size is greater than that of the expected type.
      
      From-SVN: r158398
      169afcb9
    • GCC Administrator's avatar
      Daily bump. · 1f24872b
      GCC Administrator authored
      From-SVN: r158397
      1f24872b
  2. Apr 15, 2010
    • Kaz Kojima's avatar
      re PR target/43741 (sh-elf ICEs for libstdc++-v3/src/ios_init.cc with -m2a) · 7140f0f9
      Kaz Kojima authored
      	PR target/43471
      	* config/sh/sh.c (sh_legitimize_reload_address): Use
      	MAYBE_BASE_REGISTER_RTX_P instead of BASE_REGISTER_RTX_P.
      	Remove a unneeded check for offset_base.
      
      From-SVN: r158393
      7140f0f9
    • Steven G. Kargl's avatar
      re PR fortran/30073 (Array out of bounds gives name of RHS array not LHS array) · e3e529d1
      Steven G. Kargl authored
          PR fortran/30073
          * trans-array.c (gfc_trans_array_bound_check): Eliminate a redundant
          block of code.  Set name to the variable associated with the descriptor.
      
      From-SVN: r158392
      e3e529d1
    • Eric Botcazou's avatar
      cuintp.c (UI_To_gnu): Fix long line. · 58c8f770
      Eric Botcazou authored
      	* gcc-interface/cuintp.c (UI_To_gnu): Fix long line.
      	* gcc-interface/gigi.h (MARK_VISITED): Skip objects of constant class.
      	(process_attributes): Delete.
      	(post_error_ne_num): Change parameter name.
      	* gcc-interface/decl.c (gnat_to_gnu_entity): Do not force debug info
      	with -g3.  Remove a couple of obsolete lines.  Minor tweaks.
      	If type annotating mode, operate on trees to compute the adjustment to
      	the sizes of tagged types.  Fix long line.
      	(cannot_be_superflat_p): Tweak head comment.
      	(annotate_value): Fold local constant.
      	(set_rm_size): Fix long line.
      	* gcc-interface/trans.c (Identifier_to_gnu): Rework comments.
      	(Attribute_to_gnu): Fix long line.
      	<Attr_Size>: Remove useless assertion.
      	Reorder statements.  Use size_binop routine.
      	(Loop_Statement_to_gnu): Use build5 in lieu of build_nt.
      	Create local variables for the label and the test.  Tweak comments.
      	(Subprogram_Body_to_gnu): Reset cfun to NULL.
      	(Compilation_Unit_to_gnu): Use the Sloc of the Unit node.
      	(process_inlined_subprograms): Integrate into...
      	(Compilation_Unit_to_gnu): ...this.
      	(gnat_to_gnu): Fix long line.
      	(post_error_ne_num): Change parameter name.
      	* gcc-interface/utils.c (process_attributes): Static-ify.
      	<ATTR_MACHINE_ATTRIBUTE>: Set input_location before proceeding.
      	(create_type_decl): Add comment.
      	(create_var_decl_1): Process the attributes after adding the VAR_DECL
      	to the current binding level.
      	(create_subprog_decl): Likewise for the FUNCTION_DECL.
      	(end_subprog_body): Do not reset cfun to NULL.
      	(build_vms_descriptor32): Fix long line.
      	(build_vms_descriptor): Likewise.
      	(handle_nonnull_attribute): Likewise.
      	(convert_vms_descriptor64): Likewise.
      	* gcc-interface/utils2.c (fill_vms_descriptor): Fix long line.
      	(gnat_protect_expr): Fix thinko.
      
      From-SVN: r158390
      58c8f770
    • Eric Botcazou's avatar
      trans.c (gigi): Set DECL_IGNORED_P on EH functions. · 1fc24649
      Eric Botcazou authored
      	* gcc-interface/trans.c (gigi): Set DECL_IGNORED_P on EH functions.
      	(gnat_to_gnu) <N_Op_Eq>: Restore the value of input_location
      	before translating the top-level node.
      	(lvalue_required_p) <N_Function_Call>: Return 1 if !constant.
      	<N_Object_Declaration>: Likewise.
      	<N_Assignment_Statement>: Likewise.
      	<N_Unchecked_Type_Conversion>: Likewise.
      	(call_to_gnu): Remove kludge.
      	(gnat_to_gnu) <N_Return_Statement>: When not optimizing, force labels
      	associated with user returns to be preserved.
      	(gnat_to_gnu): Add special code to deal with boolean rvalues.
      	* gcc-interface/utils2.c (compare_arrays): Set input_location on all
      	comparisons.
      	(build_unary_op) <ADDR_EXPR>: Call build_fold_addr_expr.
      	<INDIRECT_REF>: Call build_fold_indirect_ref.
      
      From-SVN: r158388
      1fc24649
    • H.J. Lu's avatar
      Regenerate gcc/configure. · bafaef55
      H.J. Lu authored
      2010-04-15  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* configure: Regenerated.
      
      From-SVN: r158386
      bafaef55
    • Andreas Krebbel's avatar
      s390.c (s390_call_save_register_used): Switch back to HARD_REGNO_NREGS. · e8de8fea
      Andreas Krebbel authored
      2010-04-15  Andreas Krebbel  <Andreas.Krebbel@de.ibm.com>
      
      	* config/s390/s390.c (s390_call_save_register_used): Switch back
      	to HARD_REGNO_NREGS.
      
      From-SVN: r158384
      e8de8fea
    • Joel Sherrill's avatar
      g-socket.adb: A target can have multiple missing errno's. · 8c709695
      Joel Sherrill authored
      2010-04-15  Joel Sherrill <joel.sherrill@oarcorp.com>
      
      	* g-socket.adb: A target can have multiple missing errno's.  This
      	will result in multiple errno's being defined as -1.  Because of this
      	we can not use a case but must use a series of if's to avoid 
      	a duplicate case error in GNAT.Sockets.Resolve_Error.
      
      From-SVN: r158382
      8c709695
    • Joel Sherrill's avatar
      gsocket.h: Run-time can no longer be built without network OS headers available. · d8a653c5
      Joel Sherrill authored
      2010-04-13  Joel Sherrill <joel.sherrill@oarcorp.com>
      
      	* gsocket.h: Run-time can no longer be built without network
      	OS headers available.  Changing RTEMS GNAT build procedure to
      	reflect this and letting run-time build use network .h files.
      
      From-SVN: r158381
      d8a653c5
    • Richard Guenther's avatar
      alias.c (alias_set_subset_of): Handle alias-set zero child properly. · 038a39d1
      Richard Guenther authored
      2010-04-15  Richard Guenther  <rguenther@suse.de>
      
      	* alias.c (alias_set_subset_of): Handle alias-set zero
      	child properly.
      
      From-SVN: r158380
      038a39d1
    • Mark Shinwell's avatar
      thumb2.md (thumb2_movsi_insn): Split ldr and str alternatives according to use... · 28907f9a
      Mark Shinwell authored
      thumb2.md (thumb2_movsi_insn): Split ldr and str alternatives according to use of high and low regs.
      
      	gcc/
      	* config/arm/thumb2.md (thumb2_movsi_insn): Split ldr and str
      	alternatives according to use of high and low regs.
      	* config/arm/vfp.md (thumb2_movsi_vfp): Likewise.
      	* config/arm/arm.h (CONDITIONAL_REGISTER_USAGE): Use high regs when
      	optimizing for size on Thumb-2.
      
      
      Co-Authored-By: default avatarJulian Brown <julian@codesourcery.com>
      
      From-SVN: r158378
      28907f9a
    • Thomas Schwinge's avatar
      config.gcc: Handle softfp as for Linux. · 3f56ef8b
      Thomas Schwinge authored
      2010-04-15 Thomas Schwinge <tschwinge@gnu.org>
      
      	gcc/
      	* config.gcc <i[34567]86-*-gnu*>: Handle softfp as for Linux.
      
      	libgcc/
      	* config.host <i[34567]86-*-gnu*>: Handle softfp as for Linux.
      
      From-SVN: r158375
      3f56ef8b
    • Richard Guenther's avatar
      tree-ssa-structalias.c (struct variable_info): Add is_fn_info flag. · 25a6a873
      Richard Guenther authored
      2010-04-15  Richard Guenther  <rguenther@suse.de>
      
      	* tree-ssa-structalias.c (struct variable_info): Add
      	is_fn_info flag.
      	(new_var_info): Initialize it.
      	(dump_constraints): Support printing last added constraints.
      	(debug_constraints): Adjust.
      	(dump_constraint_graph): Likewise.
      	(make_heapvar_for): Check for NULL cfun.
      	(get_function_part_constraint): New function.
      	(get_fi_for_callee): Likewise.
      	(find_func_aliases): Properly implement IPA PTA constraints.
      	(process_ipa_clobber): New function.
      	(find_func_clobbers): Likewise.
      	(insert_into_field_list_sorted): Remove.
      	(create_function_info_for): Properly allocate vars for IPA mode.
      	Do not use insert_into_field_list_sorted.
      	(create_variable_info_for): Properly generate constraints for
      	global vars in IPA mode.
      	(dump_solution_for_var): Always dump the solution.
      	(set_uids_in_ptset): Initialize DECL_PT_UID if in ipa-mode.
      	(find_what_var_points_to): Adjust.
      	(pt_solution_set): Change.
      	(pt_solution_ior_into): New function.
      	(pt_solution_empty_p): Export.
      	(pt_solution_includes_global): Adjust.
      	(pt_solution_includes_1): Likewise.
      	(pt_solutions_intersect_1): Likewise.
      	(dump_sa_points_to_info): Check some invariants.
      	(solve_constraints): Move constraint dumping ...
      	(compute_points_to_sets): ... here.
      	(ipa_pta_execute): ... and here.
      	(compute_may_aliases): Do not re-compute points-to info
      	locally if IPA info is available.
      	(ipa_escaped_pt): New global var.
      	(ipa_pta_execute): Properly implement IPA PTA.
      	* tree-into-ssa.c (dump_decl_set): Support dumping
      	decls not in referenced-vars.
      	* tree-flow.h (struct gimple_df): Add ipa_pta flag.
      	* tree-ssa-alias.c (ptr_deref_may_alias_decl_p): Adjust.
      	(dump_points_to_solution): Likewise.
      	* tree-dfa.c (dump_variable): Also dump DECL_PT_UID.
      	* tree-inline.c (remap_ssa_name): Copy IPA points-to solution.
      	(remap_gimple_stmt): Reset call clobber/use information if
      	necessary.
      	(copy_decl_to_var): Copy DECL_PT_UID.
      	(copy_result_decl_to_var): Likewise.
      	* tree.c (make_node_stat): Initialize DECL_PT_UID.
      	(copy_node_stat): Copy it.
      	* tree.h (DECL_PT_UID): New macro.
      	(SET_DECL_PT_UID): Likewise.
      	(DECL_PT_UID_SET_P): Likewise.
      	(struct tree_decl_minimal): Add pt_uid member.
      	* tree-ssa-alias.h (struct pt_solution): Add ipa_escaped flag.
      	(pt_solution_empty_p): Declare.
      	(pt_solution_set): Adjust.
      	(ipa_escaped_pt): Declare.
      	* cfgexpand.c (update_alias_info_with_stack_vars): Adjust.
      	* gimple-pretty-print.c (pp_points_to_solution): New function.
      	(dump_gimple_call): Dump call clobber/use information.
      	* tree-dump.c (dump_option_value_in): Add TDF_ALIAS entry.
      	* tree-pass.h (TDF_ALIAS): New dump option.
      	* tree-pretty-print.c (dump_decl_name): Dump DECL_PT_UID if asked to.
      	* doc/invoke.texi (-fipa-pta): Update documentation.
      
      	* gcc.dg/ipa/ipa-pta-1.c: New testcase.
      	* gcc.dg/ipa/ipa-pta-2.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-3.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-4.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-5.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-6.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-7.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-8.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-9.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-10.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-11.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-12.c: Likewise.
      	* gcc.dg/ipa/ipa-pta-13.c: Likewise.
      	* gcc.dg/torture/ipa-pta-2.c: Likewise.
      	* gcc.dg/torture/ipa-pta-1.c: Adjust.
      
      From-SVN: r158374
      25a6a873
    • Richard Guenther's avatar
      Makefile.in (OBJS-common): Add gimple-fold.o. · cbdd87d4
      Richard Guenther authored
      2010-04-15  Richard Guenther  <rguenther@suse.de>
      
      	* Makefile.in (OBJS-common): Add gimple-fold.o.
      	(gimple-fold.o): New rule.
      	* tree.h (maybe_fold_offset_to_reference,
      	maybe_fold_offset_to_address, maybe_fold_stmt_addition): Move
      	prototypes ...
      	* gimple.h: ... here.
      	* tree-flow.h (fold_stmt, fold_stmt_inplace, get_symbol_constant_value,
      	may_propagate_address_into_dereference): Move prototypes ...
      	* gimple.h: ... here.
      	* tree-ssa-ccp.c (get_symbol_constant_value,
      	may_propagate_address_into_dereference, maybe_fold_offset_to_array_ref,
      	maybe_fold_offset_to_component_ref, maybe_fold_offset_to_reference,
      	maybe_fold_offset_to_address, maybe_fold_stmt_indirect,
      	maybe_fold_stmt_addition, maybe_fold_reference, get_maxval_strlen,
      	ccp_fold_builtin, fold_gimple_assign, fold_gimple_cond,
      	fold_gimple_call, fold_stmt_1, fold_stmt, fold_stmt_inplace,
      	gimplify_and_update_call_from_tree): Move ...
      	* gimple-fold.c: ... here.  New file.
      	(ccp_fold_builtin): Rename to ...
      	(gimple_fold_builtin): ... this.
      	* tree-ssa-ccp.c (execute_fold_all_builtins): Adjust.
      
      From-SVN: r158373
      cbdd87d4
Loading