Skip to content
Snippets Groups Projects
  1. Oct 22, 2011
  2. Sep 28, 2011
    • Doug Evans's avatar
      timeval-utils.h: New file. · 8c850a5a
      Doug Evans authored
      	include/
      	* timeval-utils.h: New file.
      
      	libiberty/
      	* timeval-utils.c: New file.
      	* Makefile.in (CFILES): Add it.
      	(REQUIRED_OFILES): Add timeval-utils.$(objext).
      	(INSTALLED_HEADERS): Add timeval-utils.h.
      	(timeval-utils.$(objext)): Add rule.
      
      From-SVN: r179319
      8c850a5a
    • Doug Evans's avatar
      libiberty.h (countargv): Declare. · be50fcea
      Doug Evans authored
      	include/
      	* libiberty.h (countargv): Declare.
      
      	libiberty/
      	* argv.c (countargv): New function.
      
      From-SVN: r179318
      be50fcea
  3. Sep 26, 2011
  4. Sep 23, 2011
    • Cary Coutant's avatar
      re PR c++/40831 (g++ generated symbols for cloned function that be demangled.) · 2d2b02c4
      Cary Coutant authored
      include/ChangeLog:
      
      	PR 40831
      	* demangle.h (enum demangle_component_type): Add
      	DEMANGLE_COMPONENT_CLONE.
      
      libiberty/ChangeLog:
      
      	PR 40831
      	* cp-demangle.c (d_make_comp): Add new component type.
      	(cplus_demangle_mangled_name): Check for clone suffixes.
      	(d_parmlist): Don't error out if we see '.'.
      	(d_clone_suffix): New function.
      	(d_print_comp): Print info for clone suffixes.
      	* testsuite/demangle-expected: Add new testcases.
      
      From-SVN: r179132
      2d2b02c4
  5. Jul 25, 2011
  6. Jul 22, 2011
    • Jakub Jelinek's avatar
      dwarf2.h (DW_AT_GNU_macros): New. · 520cda8c
      Jakub Jelinek authored
      	* dwarf2.h (DW_AT_GNU_macros): New.
      	(enum dwarf_macro_record_type): New enum.  Add DW_MACRO_GNU_*.
      
      	* dwarf2out.c (struct macinfo_struct): Change code to unsigned char.
      	(DEBUG_MACRO_SECTION, DEBUG_MACRO_SECTION_LABEL): Define.
      	(dwarf_attr_name): Handle DW_AT_GNU_macros.
      	(dwarf2out_define): If the vector is empty and
      	lineno is 0, emit a dummy entry first.
      	(dwarf2out_undef): Likewise.  Remove redundant semicolon.
      	(htab_macinfo_hash, htab_macinfo_eq, output_macinfo_op,
      	optimize_macinfo_range): New functions.
      	(output_macinfo): Use them.  If !dwarf_strict and .debug_str is
      	mergeable, optimize longer strings using
      	DW_MACRO_GNU_{define,undef}_indirect and if HAVE_COMDAT_GROUP,
      	optimize longer sequences of define/undef ops from headers
      	using DW_MACRO_GNU_transparent_include.  For !dwarf_strict
      	emit a section headers.
      	(dwarf2out_init): For !dwarf_strict set debug_macinfo_section
      	and macinfo_section_label to DEBUG_MACRO_SECTION
      	resp. DEBUG_MACRO_SECTION_LABEL.
      	(dwarf2out_finish): For !dwarf_strict emit DW_AT_GNU_macros
      	instead of DW_AT_macro_info.
      
      From-SVN: r176653
      520cda8c
    • Jakub Jelinek's avatar
      re PR c++/49756 (g++ ICE) · d423df48
      Jakub Jelinek authored
      	PR c++/49756
      	* libiberty.h (stack_limit_increase): New prototype.
      
      	* stack-limit.c: New file.
      	* Makefile.in: Regenerate deps.
      	(CFILES): Add stack-limit.c.
      	(REQUIRED_OFILES): Add ./stack-limit.$(objext).
      	* configure.ac (checkfuncs): Add getrlimit and setrlimit.
      	(AC_CHECK_FUNCS): Likewise.
      	* configure: Regenerated.
      	* config.in: Regenerated.
      
      	* gcc.c (main): Call stack_limit_increase (64MB).
      	* toplev.c (toplev_main): Likewise.
      
      From-SVN: r176617
      d423df48
  7. Jul 14, 2011
    • Sriraman Tallam's avatar
      2012011-07-13 Sriraman Tallam <tmsriram@google.com> · 8ff3369c
      Sriraman Tallam authored
      	
      	* plugin-api.h
      	(ld_plugin_section): New struct.
      	(ld_plugin_get_section_count): New typedef.
      	(ld_plugin_get_section_type): New typedef.
      	(ld_plugin_get_section_name): New typedef.
      	(ld_plugin_get_section_contents): New typedef.
      	(ld_plugin_update_section_order): New typedef.
      	(ld_plugin_allow_section_ordering): New typedef.
      	(LDPT_GET_SECTION_COUNT): New enum value.
      	(LDPT_GET_SECTION_TYPE): New enum value.
      	(LDPT_GET_SECTION_NAME): New enum value.
      	(LDPT_GET_SECTION_CONTENTS): New enum value.
      	(LDPT_UPDATE_SECTION_ORDER): New enum value.
      	(LDPT_ALLOW_SECTION_ORDERING): New enum value.
      	(tv_get_section_count): New struct members.
      	(tv_get_section_type): New struct members.
      	(tv_get_section_name): New struct members.
      	(tv_get_section_contents): New struct members.
      	(tv_update_section_order): New struct members.
      	(tv_allow_section_ordering): New struct members.
      
      From-SVN: r176260
      8ff3369c
  8. Jul 01, 2011
    • Joel Brobecker's avatar
      Darwin has case-insensitive filesystems · 985b34c7
      Joel Brobecker authored
      HFS+, the FS on Darwin, is case insensitive. So this patch adjusts
      filename_cmp.c to ignore the casing when comparing filenames on Darwin.
      
      include/ChangeLog:
      
              * filenames.h (HAVE_CASE_INSENSITIVE_FILE_SYSTEM): Define
              on Darwin, as well as on the systems that use a DOS-like
              filesystem.
      
      libiberty/ChangeLog:
      
              * filename_cmp.c (filename_cmp, filename_ncmp): Add handling of
              HAVE_CASE_INSENSITIVE_FILE_SYSTEM.
      
      From-SVN: r175762
      985b34c7
  9. Jun 22, 2011
    • Jakub Jelinek's avatar
      re PR debug/47858 (IPA-SRA decreases quality of debug info) · ddb555ed
      Jakub Jelinek authored
      	PR debug/47858
      	* gimple.h (enum gimple_debug_subcode): Add GIMPLE_DEBUG_SOURCE_BIND.
      	(gimple_build_debug_source_bind_stat): New prototype.
      	(gimple_build_debug_source_bind): Define.
      	(gimple_debug_source_bind_p, gimple_debug_source_bind_get_var,
      	gimple_debug_source_bind_get_value,
      	gimple_debug_source_bind_get_value_ptr,
      	gimple_debug_source_bind_set_var,
      	gimple_debug_source_bind_set_value): New inlines.
      	* gimple.c (gimple_build_debug_source_bind_stat): New function.
      	* gimple-pretty-print.c (dump_gimple_debug): Handle
      	GIMPLE_DEBUG_SOURCE_BIND.
      	* sese.c (rename_uses): Handle gimple_debug_source_bind_p.
      	* tree-ssa-dce.c (mark_stmt_if_obviously_necessary): Likewise.
      	* tree-parloops.c (eliminate_local_variables,
      	separate_decls_in_region): Likewise.
      	(separate_decls_in_region_debug): Renamed from
      	separate_decls_in_region_debug_bind.  Handle
      	gimple_debug_source_bind_p.
      	* tree.h (decl_debug_args_lookup, decl_debug_args_insert): New
      	prototypes.
      	(DECL_HAS_DEBUG_ARGS_P): Define.
      	(struct tree_function_decl): Add has_debug_args_flag field.
      	* tree.c (debug_args_for_decl): New variable.
      	(decl_debug_args_lookup, decl_debug_args_insert): New functions.
      	* tree-into-ssa.c (mark_def_sites): Handle uses in debug stmts.
      	(rewrite_debug_stmt_uses): New function.
      	(rewrite_stmt): Use it to rewrite debug stmt uses.
      	* rtl.def (DEBUG_PARAMETER_REF): New.
      	* rtl.h (DEBUG_PARAMETER_REF_DECL): Define.
      	* cselib.c (rtx_equal_for_cselib_1, cselib_hash_rtx): Handle
      	DEBUG_PARAMETER_REF.
      	* rtl.c (rtx_equal_p_cb, rtx_equal_p, iterative_hash_rtx): Likewise.
      	* print-rtl.c (print_rtx): Likewise.
      	* tree-sra.c (sra_ipa_reset_debug_stmts): Prefer replacing of
      	SSA_NAMEs with DEBUG_EXPR_DECLs initialized in source bind
      	debug stmts in the first bb.
      	* tree-inline.c (remap_ssa_name): If remapping default def
      	of a PARM_DECL fails, map to a DEBUG_EXPR_DECL set in
      	a source bind debug stmt.
      	(remap_gimple_stmt): Handle gimple_debug_source_bind_p.
      	(maybe_move_debug_stmts_to_successors): Likewise.
      	(copy_debug_stmt): Likewise.  Avoid shadowing a variable.
      	(tree_function_versioning): If DECL_HAS_DEBUG_ARGS_P, copy
      	debug args vector from old_decl to new_decl.
      	* ipa-prop.c (ipa_modify_call_arguments): For optimized away
      	or modified parameters, add debug bind stmts before call
      	setting DEBUG_EXPR_DECL which is remembered in debug args
      	vector.
      	* cfgexpand.c (expand_call_stmt): Call expand_debug_expr
      	on DECL_DEBUG_EXPRs from debug args vector.
      	(expand_debug_source_expr): New function.
      	(expand_debug_locations): Use it for source bind insns.
      	(expand_gimple_basic_block): Handle gimple_debug_source_bind_p.
      	* var-tracking.c (prepare_call_arguments): Add debug args
      	to call_arguments if any.
      	* dwarf2out.c (dwarf_stack_op_name, size_of_loc_descr,
      	output_loc_operands, output_loc_operands_raw,
      	resolve_addr_in_expr, compare_loc_operands): Handle
      	DW_OP_GNU_parameter_ref.
      	(get_ref_die_offset, parameter_ref_descriptor): New functions.
      	(mem_loc_descriptor): Handle DEBUG_PARAMETER_REF.
      	(gen_subprogram_die): Handle parameters identified by
      	DEBUG_PARAMETER_REF.
      
      	* dwarf2.h (enum dwarf_location_atom): Add DW_OP_GNU_parameter_ref.
      
      From-SVN: r175288
      ddb555ed
  10. Jun 13, 2011
    • Jan Kratochvil's avatar
      demangle.h (DMGL_RET_POSTFIX): Extend the comment. · f019462c
      Jan Kratochvil authored
      include/
      	* demangle.h (DMGL_RET_POSTFIX): Extend the comment.
      	(DMGL_RET_DROP): New.
      
      libiberty/
      	* cp-demangle.c (d_print_comp) <DEMANGLE_COMPONENT_FUNCTION_TYPE>: Do
      	not pass DMGL_RET_POSTFIX or DMGL_RET_DROP.  Support DMGL_RET_DROP.
      	* testsuite/demangle-expected: New testcases for --ret-drop.
      	* testsuite/test-demangle.c: Document --ret-drop in a comment.
      	(main): New variable ret_drop, fill it, call cplus_demangle with it.
      
      From-SVN: r175000
      f019462c
  11. Apr 30, 2011
    • Jakub Jelinek's avatar
      dwarf2.h (DW_OP_GNU_const_type, [...]): New. · be80a87e
      Jakub Jelinek authored
      	* dwarf2.h (DW_OP_GNU_const_type, DW_OP_GNU_regval_type,
      	DW_OP_GNU_deref_type, DW_OP_GNU_convert, DW_OP_GNU_reinterpret): New.
      
      	* dwarf2out.c (get_address_mode): New inline.
      	(mem_loc_descriptor): Add MEM_MODE parameter, adjust recursive calls,
      	if not dwarf_strict emit
      	DW_OP_GNU_{{const,regval,deref}_type,convert,reinterpret} when
      	desirable.  Handle FLOAT_EXTEND, FLOAT_TRUNCATE, FLOAT,
      	UNSIGNED_FLOAT, FIX and UNSIGNED_FIX.  Just return NULL for
      	FMA, STRICT_LOW_PART, CONST_VECTOR and CONST_FIXED.
      	(dwarf2out_frame_debug_cfa_expression, reg_loc_descriptor,
      	dw_loc_list_1, cst_pool_loc_descr, loc_list_from_tree): Adjust
      	mem_loc_descriptor callers.
      	(dwarf_stack_op_name, size_of_loc_descr, output_loc_operands,
      	output_loc_operands_raw, hash_loc_operands, compare_loc_operands):
      	Handle DW_OP_GNU_const_type, DW_OP_GNU_regval_type,
      	DW_OP_GNU_deref_type, DW_OP_GNU_convert and DW_OP_GNU_reinterpret.
      	(base_types): New variable.
      	(get_base_type_offset, calc_base_type_die_sizes,
      	base_type_for_mode, mark_base_types, base_type_cmp,
      	move_marked_base_types): New functions.
      	(calc_die_sizes): Assert that die_offset is 0 or equal to
      	next_die_offset.
      	(loc_descriptor): Only handle here lowpart SUBREGs of REG, for
      	others defer to mem_loc_descriptor.  Adjust mem_loc_descriptor
      	callers.  If not dwarf_strict, call mem_loc_descriptor even for
      	non-MODE_INT modes or MODE_INT modes larger than DWARF2_ADDR_SIZE.
      	(gen_subprogram_die): Don't give up on call site parameters
      	with non-integral or large integral modes.  Adjust
      	mem_loc_descriptor callers.
      	(prune_unused_types): Call prune_unused_types_mark on base_types
      	vector entries.
      	(resolve_addr): Call mark_base_types.
      	(dwarf2out_finish): Call move_marked_base_types.
      
      From-SVN: r173210
      be80a87e
  12. Apr 25, 2011
  13. Mar 31, 2011
  14. Mar 25, 2011
    • Mark Wielaard's avatar
      Remove deprecated DW_FORM_sig8 define. · ec6165f8
      Mark Wielaard authored
          * dwarf2.h (dwarf_form): Remove deprecated DW_FORM_sig8 define.
      
          * dwarf2out.c (size_of_die): Modify comment to say DW_FORM_ref_sig8.
          (value_format): Use DW_FORM_ref_sig8, not DW_FORM_sig8.
      
      From-SVN: r171442
      ec6165f8
  15. Mar 23, 2011
  16. Mar 16, 2011
    • Jakub Jelinek's avatar
      final.c (final_scan_insn): Handle NOTE_INSN_CALL_ARG_LOCATION. · 2b1c5433
      Jakub Jelinek authored
      	* final.c (final_scan_insn): Handle NOTE_INSN_CALL_ARG_LOCATION.
      	Call var_location debug hook even on CALL_INSNs.
      	(rest_of_clean_state): Don't print NOTE_INSN_CALL_ARG_LOCATION.
      	* rtl.def (ENTRY_VALUE): New.
      	* dwarf2out.c: Include cfglayout.h.
      	(dwarf_stack_op_name, size_of_loc_descr, output_loc_operands,
      	output_loc_operands_raw): Handle DW_OP_GNU_entry_value.
      	(struct call_arg_loc_node): New type.
      	(call_arg_locations, call_arg_loc_last, block_map, call_site_count,
      	tail_call_site_count): New variables.
      	(dwarf_tag_name): Handle DW_TAG_GNU_call_site and
      	DW_TAG_GNU_call_site_parameter.
      	(dwarf_attr_name): Handle DW_AT_GNU_call_site_value,
      	DW_AT_GNU_call_site_data_value, DW_AT_GNU_call_site_target,
      	DW_AT_GNU_call_site_target_clobbered, DW_AT_GNU_tail_call,
      	DW_AT_GNU_all_tail_call_sites, DW_AT_GNU_all_call_sites
      	and DW_AT_GNU_all_source_call_sites.
      	(mem_loc_descriptor): Handle ENTRY_VALUE.
      	(add_src_coords_attributes): Don't add enything if
      	DECL_SOURCE_LOCATION is UNKNOWN_LOCATION.
      	(dwarf2out_abstract_function): Save and clear call_arg_location,
      	call_site_count and tail_call_site_count around dwarf2out_decl call.
      	(gen_call_site_die): New function.
      	(gen_subprogram_die): Emit DW_TAG_GNU_call_site DIEs for call sites.
      	(gen_lexical_block_die, gen_inlined_subroutine_die): Update block_map.
      	(dwarf2out_function_decl): Clear call_arg_locations,
      	call_arg_loc_last, set call_site_count and tail_call_site_count
      	to -1 and free block_map.
      	(dwarf2out_var_location): Handle NOTE_INSN_CALL_ARG_LOCATION and
      	CALL_INSNs.  Add NOTE_DURING_CALL_P var location notes even when not
      	followed by any real instructions.
      	(dwarf2out_begin_function): Set call_site_count and
      	tail_call_site_count to 0.
      	(resolve_addr): If DW_AT_abstract_origin of DW_TAG_GNU_call_site
      	is dw_val_class_addr, attempt to look it up again, for DECL_EXTERNAL
      	attempt to force a DIE for it and worst case remove the attribute.
      	(resolve_one_addr): For TREE_CONSTANT_POOL_ADDRESS_P SYMBOL_REFs
      	check TREE_ASM_WRITTEN of DECL_INITIAL of the decl instead of
      	the decl itself.
      	* var-tracking.c: Include tm_p.h.
      	(vt_stack_adjustments): For calls call note_register_arguments.
      	(argument_reg_set): New variable.
      	(add_stores): For MO_VAL_SET of non-tracked regs from argument_reg_set
      	ensure the VALUE is resolved.
      	(call_arguments): New variable.
      	(prepare_call_arguments): New function.
      	(add_with_sets): For MO_CALL set u.loc from call_arguments and clear it.
      	(struct expand_loc_callback_data): Add ignore_cur_loc field.
      	(vt_expand_loc_callback): If ignore_cur_loc, don't look at cur_loc and
      	always use the best expression.
      	(vt_expand_loc): Add ignore_cur_loc argument.
      	(vt_expand_loc_dummy): Clear ignore_cur_loc field.
      	(emit_note_insn_var_location): Adjust vt_expand_loc callers.
      	(emit_notes_in_bb) <case MO_CALL>: Add NOTE_INSN_CALL_ARG_LOCATION
      	note for all calls.
      	(vt_add_function_parameter): Use cselib_lookup_from_insn.
      	If dv is a VALUE, enter into hash table also ENTRY_VALUE for the
      	argument.  Don't call cselib_preserve_only_values and
      	cselib_reset_table.
      	(note_register_arguments): New function.
      	(vt_initialize): Compute argument_reg_set.  Call
      	vt_add_function_parameters before processing basic blocks instead of
      	afterwards.  For calls call prepare_call_arguments before calling
      	cselib_process_insn.
      	* print-rtl.c (print_rtx): Handle NOTE_INSN_CALL_ARG_LOCATION.
      	* Makefile.in (dwarf2out.o): Depend on $(CFGLAYOUT_H).
      	(var-tracking.o): Depend on $(TM_P_H).
      	* cfglayout.h (insn_scope): New prototype.
      	* gengtype.c (adjust_field_rtx_def): Handle NOTE_INSN_CALL_ARG_LOCATION.
      	* cfglayout.c (insn_scope): No longer static.
      	* insn-notes.def (CALL_ARG_LOCATION): New.
      	* calls.c (expand_call, emit_library_call_value_1): Put USEs for
      	MEM arguments into CALL_INSN_FUNCTION_USAGE unconditionally.
      	* integrate.c (set_block_origin_self, set_block_abstract_flags): Do
      	nothing for DECL_EXTERNAL BLOCK_VARS.
      cp/
      	* cp-objcp-common.c (cp_function_decl_explicit_p): Don't crash if
      	DECL_LANG_SPECIFIC is NULL.
      include/
      	* dwarf2.h (DW_TAG_GNU_call_site, DW_TAG_GNU_call_site_parameter,
      	DW_AT_GNU_call_site_value, DW_AT_GNU_call_site_data_value,
      	DW_AT_GNU_call_site_target, DW_AT_GNU_call_site_target_clobbered,
      	DW_AT_GNU_tail_call, DW_AT_GNU_all_tail_call_sites,
      	DW_AT_GNU_all_call_sites,, DW_AT_GNU_all_source_call_sites,
      	DW_OP_GNU_entry_value): New.
      
      From-SVN: r171033
      2b1c5433
  17. Feb 28, 2011
    • Kai Tietz's avatar
      re PR debug/28047 (DWARF output_file_names should really understand DOS pathnames) · 94369251
      Kai Tietz authored
      2011-02-28  Kai Tietz  <kai.tietz@onevision.com>
      
      	PR debug/28047
      	* dwarf2out.c (file_table_eq): Use filename_cmp instead of strcmp.
      	(lookup_filename): Likewise.
      	* final.c (remap_debug_filename): Use filename_ncmp instead of
      	strncmp.
      
      2011-02-28  Kai Tietz  <kai.tietz@onevision.com>
      
      	* filename_cmp.c (filename_ncmp): New function.
      	* functions.texi: Regenerated.
      
      2011-02-28  Kai Tietz  <kai.tietz@onevision.com>
      
      	* filenames.h (filename_ncmp): New prototype.
      
      From-SVN: r170570
      94369251
  18. Feb 23, 2011
  19. Jan 12, 2011
  20. Jan 03, 2011
  21. Nov 17, 2010
    • Ian Lance Taylor's avatar
      simple-object.h (simple_object_attributes_merge): Declare, replacing... · d82f74d3
      Ian Lance Taylor authored
      simple-object.h (simple_object_attributes_merge): Declare, replacing simple_object_attributes_compare.
      
      include/:
      	* simple-object.h (simple_object_attributes_merge): Declare,
      	replacing simple_object_attributes_compare.
      libiberty/:
      	* simple-object.c (simple_object_attributes_merge): Rename from
      	simple_object_attributes_compare.  Call merge field.
      	* simple-object-common.h (struct simple_object_functions): Rename
      	attributes_compare field to attribute_merge.
      	* simple-object-elf.c (EM_SPARC): Define.
      	(EM_SPARC32PLUS): Define.
      	(simple_object_elf_attributes_merge): Renamed from
      	simple_object_elf_attributes_compare.  Permit EM_SPARC and
      	EM_SPARC32PLUS objects to be merged.
      	(simple_object_elf_functions): Update function name.
      	* simple-object-coff.c (simple_object_coff_attributes_merge):
      	Rename from simple_object_coff_attributes_compare.
      	(simple_object_coff_functions): Update function name.
      	* simple-object-mach-o.c (simple_object_mach_o_attributes_merge):
      	Renamed from simple_object_mach_o_attributes_compare.
      	(simple_object_mach_o_functions): Update function name.
      gcc/lto/:
      	* lto-object.c (lto_obj_file_open): Call
      	simple_object_attributes_merge rather than
      	simple_object_attributes_compare.
      
      From-SVN: r166848
      d82f74d3
  22. Nov 05, 2010
  23. Nov 02, 2010
    • Ian Lance Taylor's avatar
      simple-object.h: New file. · 1cfabf34
      Ian Lance Taylor authored
      
      include/:
      	* simple-object.h: New file.
      libiberty/:
      	* simple-object.c: New file.
      	* simple-object-common.h: New file.
      	* simple-object-elf.c: New file.
      	* simple-object-mach-o.c: New file.
      	* simple-object-coff.c: New file.
      	* simple-object.txh: New file.
      	* configure.ac: Add AC_TYPE_SSIZE_T.
      	* Makefile.in: Rebuild dependencies.
      	(CFILES): Add simple-object.c, simple-object-coff,
      	simple-object-elf.c, and simple-object-mach-o.c.
      	(REQUIRED_OFILES): Add corresponding object files.
      	* configure: Rebuild.
      	* config.in: Rebuild.
      	* functions.texi: Rebuild.
      
      Co-Authored-By: default avatarDave Korn <dave.korn.cygwin@gmail.com>
      Co-Authored-By: default avatarIain Sandoe <iains@gcc.gnu.org>
      
      From-SVN: r166185
      1cfabf34
  24. Oct 15, 2010
  25. Oct 06, 2010
    • Andi Kleen's avatar
      [PATCH] Report LTO phase in lto1 process name v2 · 6e9bd0f8
      Andi Kleen authored
      On larger parallel WHOPR builds I find it useful to see in top which
      phase a given lto1 is in.
      
      Set the process name to lto1-wpa, lto1-ltrans, lto1-lto depending
      on the current mode.
      
      This is currently only implemented for Linux and only
      using the "comm" process name, which is reported in top.
      
      v2: Moved function to libiberty, renamed setproctitle to match
      BSD. In theory it should pick up BSD's libc function for this
      on a BSD system, but I haven't tested this.
      
      gcc/lto/
      
      2010-10-06  Andi Kleen <ak@linux.intel.com>
      
      	* lto.c (lto_process_name): Add.
      	(lto_main): Call lto_process_name.
      
      include/
      
      2010-10-06  Andi Kleen <ak@linux.intel.com>
      
      	* libiberty.h (setproctitle): Add prototype.
      
      libiberty/
      
      2010-10-06  Andi Kleen <ak@linux.intel.com>
      
      	* Makefile.in (CFILES): Add setproctitle.
      	(CONFIGURED_OFILES): Add setproctitle.
      	(setproctitle): Add rule.
      	* config.in: Regenerate.
      	* configure: Regenerate.
      	* configure.ac: Add checks for prctl PR_SET_NAME and setproctitle.
      	* setproctitle.c: Add file.
      	* functions.texi: Regenerate.
      
      From-SVN: r165066
      6e9bd0f8
  26. Sep 09, 2010
    • Jakub Jelinek's avatar
      rtl.def (DEBUG_IMPLICIT_PTR): New rtl code. · c8a27c40
      Jakub Jelinek authored
      	* rtl.def (DEBUG_IMPLICIT_PTR): New rtl code.
      	* rtl.h (DEBUG_IMPLICIT_PTR_DECL): Define.
      	* rtl.c (rtx_equal_p_cb, rtx_equal_p): Handle DEBUG_IMPLICIT_PTR.
      	* print-rtl.c (print_rtx): Likewise.
      	* cselib.c (rtx_equal_for_cselib_p, cselib_hash_rtx): Likewise.
      	* cfgexpand.c (expand_debug_expr): Generate DEBUG_IMPLICIT_PTR
      	for ADDR_EXPR with non-addressable object.
      	* dwarf2out.c (enum dw_val_class): Add dw_val_class_decl_ref.
      	(struct dw_val_struct): Add v.val_decl_ref.
      	(dwarf_stack_op_name, output_loc_operands, output_loc_operands_raw):
      	Handle DW_OP_GNU_implicit_pointer.
      	(size_of_loc_descr): Likewise.  Fix up DW_OP_call_ref size.
      	(get_ref_die_offset_label): New function.
      	(implicit_ptr_descriptor): New function.
      	(mem_loc_descriptor): Handle DEBUG_IMPLICIT_PTR.
      	(loc_descriptor): Likewise.
      	(gen_variable_die): Put even definitions into decl_die_table.
      	(resolve_addr_in_expr): Resolve still unresolved
      	DW_OP_GNU_implicit_pointer operands, if it can't be resolved
      	return false.
      	(dwarf2out_finish): Call output_location_lists after outputting
      	.debug_info and .debug_abbrev instead of before.
      
      	* dwarf2.h (DW_OP_GNU_implicit_pointer): New.
      
      2010-09-09  Roland McGrath  <roland@redhat.com>
      
      	* dwarf2out.c (DWARF_REF_SIZE): Define.
      	(size_of_loc_descr): Use it for DW_OP_call_ref.
      
      From-SVN: r164050
      c8a27c40
  27. Jul 06, 2010
    • Ken Werner's avatar
      floatformat.h (floatformat_ieee_half_big): Add declaration. · d414dde9
      Ken Werner authored
      include/ChangeLog:
      
      2010-07-06  Ken Werner  <ken.werner@de.ibm.com>
      
      	* floatformat.h (floatformat_ieee_half_big): Add declaration.
      	(floatformat_ieee_half_little): Likewise.
      
      libiberty/ChangeLog:
      
      2010-07-06  Ken Werner  <ken.werner@de.ibm.com>
      
      	* floatformat.c (floatformat_ieee_half_big): New variable.
      	(floatformat_ieee_half_little): Likewise.
      
      From-SVN: r161867
      d414dde9
  28. Jun 21, 2010
  29. Jun 18, 2010
  30. Jun 08, 2010
    • Tristan Gingold's avatar
      dwarf2.h (enum dwarf_tag): Add DW_TAG_HP_Bliss_field and DW_TAG_HP_Bliss_field_set. · 4b9c045f
      Tristan Gingold authored
      2010-06-08  Tristan Gingold  <gingold@adacore.com>
      
      	* dwarf2.h (enum dwarf_tag): Add DW_TAG_HP_Bliss_field and
      	DW_TAG_HP_Bliss_field_set.
      	(enum dwarf_attribute): Add DW_AT_HP_prologue, DW_AT_HP_epilogue,
      	DW_AT_HP_unit_name, DW_AT_HP_unit_size, DW_AT_HP_widened_byte_size,
      	DW_AT_HP_definition_points, DW_AT_HP_default_location and
      	DW_AT_HP_is_result_param.
      	(enum dwarf_type): Add DW_ATE_HP_VAX_float, DW_ATE_HP_VAX_float_d,
      	DW_ATE_HP_packed_decimal, DW_ATE_HP_zoned_decimal, DW_ATE_HP_edited,
      	DW_ATE_HP_signed_fixed, DW_ATE_HP_unsigned_fixed,
      	DW_ATE_HP_VAX_complex_float and DW_ATE_HP_VAX_complex_float_d.
      	(enum dwarf_line_number_x_ops): Add
      	DW_LNE_HP_source_file_correlation.
      	(enum dwarf_source_language): Add DW_LANG_HP_Bliss,
      	DW_LANG_HP_Basic91, DW_LANG_HP_Pascal91, DW_LANG_HP_IMacro,
      	DW_LANG_HP_Assembler.
      
      From-SVN: r160430
      4b9c045f
    • Laurynas Biveinis's avatar
      utils.c (init_gnat_to_gnu): Use typed GC allocation. · a9429e29
      Laurynas Biveinis authored
      gcc/ada:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* gcc-interface/utils.c (init_gnat_to_gnu): Use typed GC
      	allocation.
      	(init_dummy_type): Likewise.
      	(gnat_pushlevel): Likewise.
      
      	* gcc-interface/trans.c (Attribute_to_gnu): Likewise.
      	(Subprogram_Body_to_gnu): Likewise.
      	(Compilation_Unit_to_gnu): Likewise.
      	(start_stmt_group): Likewise.
      	(extract_encoding): Likewise.
      	(decode_name): Likewise.
      
      	* gcc-interface/misc.c (gnat_printable_name): Likewise.
      
      	* gcc-interface/decl.c (annotate_value): Likewise.
      
      	* gcc-interface/ada-tree.h (struct lang_type): Add variable_size
      	GTY option.
      	(struct lang_decl): Likewise.
      	(SET_TYPE_LANG_SPECIFIC): Use typed GC allocation.
      	(SET_DECL_LANG_SPECIFIC): Likewise.
      
      gcc/c-family:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* c-pragma.c (push_alignment): Use typed GC allocation.
      	(handle_pragma_push_options): Likewise.
      
      	* c-common.c (parse_optimize_options): Likewise.
      
      	* c-common.h (struct sorted_fields_type): Add variable_size GTY
      	option.
      
      gcc/cp:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* typeck2.c (abstract_virtuals_error): Likewise.
      
      	* pt.c (maybe_process_partial_specialization): Likewise.
      	(register_specialization): Likewise.
      	(add_pending_template): Likewise.
      	(lookup_template_class): Likewise.
      	(push_tinst_level): Likewise.
      
      	* parser.c (cp_lexer_new_main): Likewise.
      	(cp_lexer_new_from_tokens): Likewise.
      	(cp_token_cache_new): Likewise.
      	(cp_parser_context_new): Likewise.
      	(cp_parser_new): Likewise.
      	(cp_parser_nested_name_specifier_opt): Likewise.
      	(cp_parser_template_id): Likewise.
      
      	* name-lookup.c (binding_entry_make): Likewise.
      	(binding_table_construct): Likewise.
      	(binding_table_new): Likewise.
      	(cxx_binding_make): Likewise.
      	(pushdecl_maybe_friend): Likewise.
      	(begin_scope): Likewise.
      	(push_to_top_level): Likewise.
      
      	* lex.c (init_reswords): Likewise.
      	(retrofit_lang_decl): Likewise.
      	(cxx_dup_lang_specific_decl): Likewise.
      	(copy_lang_type): Likewise.
      	(cxx_make_type): Likewise.
      
      	* decl.c (make_label_decl): Likewise.
      	(check_goto): Likewise.
      	(start_preparsed_function): Likewise.
      	(save_function_data): Likewise.
      
      	* cp-tree.h (TYPE_SET_PTRMEMFUNC_TYPE): Likewise.
      
      	* cp-objcp-common.c (decl_shadowed_for_var_insert): Likewise.
      
      	* class.c (finish_struct_1): Likewise.
      
      	* cp-tree.h (struct lang_type): Add variable_size GTY option.
      	(struct lang_decl): Likewise.
      
      	* parser.c (cp_parser_new): Update comment to not reference
      	ggc_alloc.
      
      gcc/fortran:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* trans-types.c (gfc_get_nodesc_array_type): Use typed GC
      	allocation.
      	(gfc_get_array_type_bounds): Likewise.
      
      	* trans-decl.c (gfc_allocate_lang_decl): Likewise.
      	(gfc_find_module): Likewise.
      
      	* f95-lang.c (pushlevel): Likewise.
      
      	* trans.h (struct lang_type): Add variable_size GTY option.
      	(struct lang_decl): Likewise.
      
      gcc/java:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* jcf-reader.c (jcf_parse_constant_pool): Use typed GC allocation.
      
      	* jcf-parse.c (java_parse_file): Likewise.
      	(process_zip_dir): Likewise.
      
      	* java-tree.h (MAYBE_CREATE_VAR_LANG_DECL_SPECIFIC): Likewise.
      	(MAYBE_CREATE_TYPE_TYPE_LANG_SPECIFIC): Likewise.
      
      	* expr.c (add_type_assertion): Likewise.
      
      	* decl.c (make_binding_level): Likewise.
      	(java_dup_lang_specific_decl): Likewise.
      
      	* constants.c (set_constant_entry): Likewise.
      	(cpool_for_class): Likewise.
      
      	* class.c (add_method_1): Likewise.
      	(java_treetreehash_new): Likewise.
      
      	* java-tree.h (struct lang_type): Add variable_size GTY option.
      	(struct lang_decl): Likewise.
      
      	* jch.h (struct cpool_entry): Likewise.
      
      	* java-tree.h (java_treetreehash_create): Remove parameter ggc.
      
      	* except.c (prepare_eh_table_type): Update
      	java_treetreehash_create call.
      
      	* class.c (add_method_1): Update java_treetreehash_create call.
      	(java_treetreehash_create): Remove parameter gc.  Use
      	htab_create_ggc.
      
      gcc/lto:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* lto.c (lto_read_in_decl_state): Use typed GC allocation.
      	(lto_file_read): Likewise.
      	(new_partition): Likewise.
      	(read_cgraph_and_symbols): Likewise.
      
      gcc/objc:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* objc-act.h (ALLOC_OBJC_TYPE_LANG_SPECIFIC): Use typed GC
      	allocation.
      
      	* objc-act.c (objc_volatilize_decl): Likewise.
      	(objc_build_string_object): Likewise.
      	(hash_init): Likewise.
      	(hash_enter): Likewise.
      	(hash_add_attr): Likewise.
      	(add_class): Likewise.
      	(start_class): Likewise.
      
      gcc/objcp:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* objcp-decl.h (ALLOC_OBJC_TYPE_LANG_SPECIFIC): Use typed GC
      	allocation.
      
      gcc:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* doc/tm.texi (Per-Function Data): Do not reference ggc_alloc.
      
      	* doc/gty.texi (GTY Options): Document typed GC allocation and
      	variable_size GTY option.
      
      	* ggc-internal.h: New.
      
      	* ggc.h: Update copyright year.
      	(digit_string): Move to stringpool.c.
      	(ggc_mark_stringpool, ggc_purge_stringpool, ggc_mark_roots)
      	(gt_pch_save_stringpool, gt_pch_fixup_stringpool)
      	(gt_pach_restore_stringpool, gt_pch_p_S, gt_pch_note_object)
      	(init_ggc_pch, ggc_pch_count_object, ggc_pch_total_size)
      	(ggc_pch_this_base, ggc_pch_alloc_object, ggc_pch_prepare_write)
      	(ggc_pch_write_object, ggc_pch_finish, ggc_pch_read)
      	(ggc_force_collect, ggc_get_size, ggc_statistics)
      	(ggc_print_common_statistics): Move to ggc-internal.h.
      	(digit_vector, new_ggc_zone, destroy_ggc_zone, ggc_alloc_stat)
      	(ggc_alloc, ggc_alloc_cleared, ggc_realloc, ggc_calloc, GGC_NEW)
      	(GGC_CNEW, GGC_NEWVEC, GGC_CNEWVEC, GGC_NEWVAR, ggc_alloc_rtvec)
      	(ggc_alloc_tree, gt_pch_save, ggc_min_expand_heuristic)
      	(ggc_min_heapsize_heuristic, ggc_alloc_zone)
      	(ggc_alloc_zone_pass_stat): Remove.
      	(ggc_internal_alloc_stat, ggc_internal_alloc)
      	(ggc_internal_cleared_alloc_stat): New.
      	(GGC_RESIZEVEC, GGC_RESIZEVAR): Redefine.
      	(ggc_internal_vec_alloc_stat)
      	(ggc_internal_cleared_vec_alloc_stat)
      	(ggc_internal_vec_alloc_stat, ggc_internal_cleared_vec_alloc)
      	(ggc_alloc_atomic_stat, ggc_alloc_atomic)
      	(ggc_alloc_cleared_atomic, ggc_cleared_alloc_htab_ignore_args)
      	(ggc_cleared_alloc_ptr_array_two_args): New.
      	(htab_create_ggc, splay_tree_new_ggc): Redefine.
      	(ggc_splay_alloc): Change the type of the first argument to
      	enum gt_types_enum.
      	(ggc_alloc_string): Make macro.
      	(ggc_alloc_string_stat): New.
      	(ggc_strdup): Redefine.
      	(rtl_zone, tree_zone, tree_id_zone): Declare unconditionally.
      	(ggc_alloc_rtvec_sized): New.
      	(ggc_alloc_zone_stat): Rename to ggc_internal_alloc_zone_stat.
      	(ggc_internal_alloc_zone_pass_stat, ggc_internal_alloc_zone_stat)
      	(ggc_internal_cleared_alloc_zone_stat)
      	(ggc_internal_zone_alloc_stat)
      	(ggc_internal_zone_cleared_alloc_stat)
      	(ggc_internal_zone_vec_alloc_stat)
      	(ggc_alloc_zone_rtx_def_stat)
      	(ggc_alloc_zone_tree_node_stat)
      	(ggc_alloc_zone_cleared_tree_node_stat)
      	(ggc_alloc_cleared_gimple_statement_d_stat): New.
      
      	* ggc-common.c: Include ggc-internal.h.
      	(ggc_internal_cleared_alloc_stat): Rename from
      	ggc_alloc_cleared_stat.
      	(ggc_realloc_stat): Use ggc_internal_alloc_stat.
      	(ggc_calloc): Remove.
      	(ggc_cleared_alloc_htab_ignore_args): New.
      	(ggc_cleared_alloc_ptr_array_two_args): New.
      	(ggc_splay_alloc): Add obj_type parameter.
      	(init_ggc_heuristics): Formatting fixes.
      
      	* ggc-none.c: Update copyright year.
      	(ggc_alloc_stat): Rename to ggc_alloc_stat.
      	(ggc_alloc_cleared_stat): Rename to
      	ggc_internal_cleared_alloc_stat.
      	(struct alloc_zone, rtl_zone, tree_zone, tree_id_zone): New.
      
      	* ggc-page.c: Update copyright year.  Include ggc-internal.h.
      	Remove references to ggc_alloc in comments.
      	(ggc_alloc_typed_stat): Call ggc_internal_alloc_stat.
      	(ggc_alloc_stat): Rename to ggc_internal_alloc_stat.
      	(new_ggc_zone, destroy_ggc_zone): Remove.
      	(struct alloc_zone, rtl_zone, tree_zone, tree_id_zone): New.
      
      	* ggc-zone.c: Include ggc-internal.h.  Remove references to
      	ggc_alloc in comments.
      	(ggc_alloc_zone_stat): ggc_internal_alloc_zone_stat.
      	(ggc_internal_alloc_zone_pass_stat): New.
      	(ggc_internal_cleared_alloc_zone_stat): New.
      	(ggc_alloc_typed_stat): Use ggc_internal_alloc_zone_pass_stat.
      	(ggc_alloc_stat): Rename ggc_internal_alloc_stat.
      	(new_ggc_zone, destroy_ggc_zone): Remove.
      
      	* stringpool.c: Update copyright year.  Include ggc-internal.h
      	(digit_vector): Make static.
      	(digit_string): Moved from ggc.h.
      	(stringpool_ggc_alloc): Use ggc_alloc_atomic.
      	(ggc_alloc_string): Rename to ggc_alloc_string_stat.
      
      	* Makefile.in (GGC_INTERNAL_H): New.
      	(ggc_common.o, ggc-page.o, ggc-zone.o, stringpool.o): Add
      	$(GGC_INTERNAL_H) to dependencies.
      
      	* gentype.c: Update copyright year.
      	(walk_type): Accept variable_size GTY option.
      	(USED_BY_TYPED_GC_P): New macro.
      	(write_enum_defn): Use USED_BY_TYPED_GC_P.  Do not output
      	whitespace at the end of strings.
      	(get_type_specifier, variable_size_p): New functions.
      	(alloc_quantity, alloc_zone): New enums.
      	(write_typed_alloc_def): New function.
      	(write_typed_struct_alloc_def): Likewise.
      	(write_typed_typed_typedef_alloc_def): Likewise.
      	(write_typed_alloc_defns): Likewise.
      	(output_typename, write_splay_tree_allocator_def): Likewise.
      	(write_splay_tree_allocators): Likewise.
      	(main): Call write_typed_alloc_defns and
      	write_splay_tree_allocators.
      
      	* lto-streamer.h (lto_file_decl_data_ptr): New.
      
      	* passes.c (order): Define using cgraph_node_ptr.
      
      	* strinpool.c (struct string_pool_data): Declare nested_ptr using
      	ht_identifier_ptr.
      
      	* gimple.h (union gimple_statement_d): Likewise.
      
      	* rtl.h (struct rtx_def): Likewise.
      	(struct rtvec_def): Likewise.
      
      	* tree.h (union tree_node): Likewise.
      
      	* tree-ssa-operands.h (struct ssa_operand_memory_d): Likewise.
      
      	* cfgloop.c (record_loop_exits): Use htab_create_ggc.
      
      	* tree-scalar-evolution.c (scev_initialize): Likewise.
      
      	* alias.c (record_alias_subset): Update splay_tree_new_ggc call.
      
      	* dwarf2asm.c (dw2_force_const_mem): Likewise.
      
      	* omp-low.c (lower_omp_critical): Likewise.
      
      	* bitmap.h (struct bitmap_head_def): Update comment to not
      	reference ggc_alloc.
      
      	* config/pa/pa.c (get_deferred_label): Use GGC_RESIZEVEC.
      
      	* ira.c (fix_reg_equiv_init): Use GGC_RESIZEVEC.
      
      	* ipa-prop.c (duplicate_ggc_array): Rename to
      	duplicate_ipa_jump_func_array.  Use typed GC allocation.
      	(ipa_edge_duplication_hook): Call duplicate_ipa_jump_func_array.
      
      	* gimple.c (gimple_alloc_stat): Use
      	ggc_alloc_cleared_gimple_statement_d_stat.
      
      	* varasm.c (create_block_symbol): Use ggc_alloc_zone_rtx_def.
      
      	* tree.c (make_node_stat): Use
      	ggc_alloc_zone_cleared_tree_node_stat.
      	(make_tree_vec_stat): Likewise.
      	(build_vl_exp_stat): Likewise.
      	(copy_node_stat): Use ggc_alloc_zone_tree_node_stat.
      	(make_tree_binfo_stat): Likewise.
      	(tree_cons_stat): Likewise.
      
      	* rtl.c (rtx_alloc_stat): Use ggc_alloc_zone_rtx_def_stat.
      	(shallow_copy_rtx_stat): Likewise.
      	(make_node_stat): Likewise.
      
      	* lto-symtab.c: Fix comment.
      
      	* tree-cfg.c (create_bb): Update comment to not reference
      	ggc_alloc_cleared.
      	* tree-ssa-structalias.c (struct heapvar_for_stmt): Fix param_is
      	value.
      
      	* varpool.c (varpool_node): Use typed GC allocation.
      	(varpool_extra_name_alias): Likewise.
      
      	* varasm.c (emutls_decl): Likewise.
      	(get_unnamed_section): Likewise.
      	(get_noswitch_section): Likewise.
      	(get_section): Likewise.
      	(get_block_for_section): Likewise.
      	(build_constant_desc): Likewise.
      	(create_constant_pool): Likewise.
      	(force_const_mem): Likewise.
      
      	* tree.c (build_vl_exp_stat): Likewise.
      	(build_real): Likewise.
      	(build_string): Likewise.
      	(decl_debug_expr_insert): Likewise.
      	(decl_value_expr_insert): Likewise.
      	(type_hash_add): Likewise.
      	(build_omp_clause): Likewise.
      
      	* tree-ssanames.c (duplicate_ssa_name_ptr_info): Likewise.
      
      	* tree-ssa.c (init_tree_ssa): Likewise.
      
      	* tree-ssa-structalias.c (heapvar_insert): Likewise.
      
      	* tree-ssa-operands.c (ssa_operand_alloc): Likewise.
      
      	* tree-ssa-loop-niter.c (record_estimate): Likewise.
      
      	* tree-ssa-alias.c (get_ptr_info): Likewise.
      
      	* tree-scalar-evolution.c (new_scev_info_str): Likewise.
      
      	* tree-phinodes.c (allocate_phi_node): Likewise.
      
      	* tree-iterator.c (tsi_link_before): Likewise.
      	(tsi_link_after): Likewise.
      
      	* tree-eh.c (add_stmt_to_eh_lp_fn): Likewise.
      
      	* tree-dfa.c (create_var_ann): Likewise.
      
      	* tree-cfg.c (create_bb): Likewise.
      
      	* toplev.c (alloc_for_identifier_to_locale): Likewise.
      	(general_init): Likewise.
      
      	* stringpool.c (stringpool_ggc_alloc): Likewise.
      	(gt_pch_save_stringpool): Likewise.
      
      	* sese.c (if_region_set_false_region): Likewise.
      
      	* passes.c (do_per_function_toporder): Likewise.
      
      	* optabs.c (set_optab_libfunc): Likewise.
      	(set_conv_libfunc): Likewise.
      
      	* lto-symtab.c (lto_symtab_register_decl): Likewise.
      
      	* lto-streamer-in.c (lto_input_eh_catch_list): Likewise.
      	(input_eh_region): Likewise.
      	(input_eh_lp): Likewise.
      	(make_new_block): Likewise.
      	(unpack_ts_real_cst_value_fields): Likewise.
      
      	* lto-section-in.c (lto_new_in_decl_state): Likewise.
      
      	* lto-cgraph.c (input_node_opt_summary): Likewise.
      
      	* loop-init.c (loop_optimizer_init): Likewise.
      
      	* lambda.h (lambda_vector_new): Likewise.
      
      	* lambda-code.c (replace_uses_equiv_to_x_with_y): Likewise.
      
      	* ira.c (update_equiv_regs): Likewise.
      
      	* ipa.c (cgraph_node_set_new): Likewise.
      	(cgraph_node_set_add): Likewise.
      	(varpool_node_set_new): Likewise.
      	(varpool_node_set_add): Likewise.
      
      	* ipa-prop.c (ipa_compute_jump_functions_for_edge): Likewise.
      	(duplicate_ipa_jump_func_array): Likewise.
      	(ipa_read_node_info): Likewise.
      
      	* ipa-cp.c (ipcp_create_replace_map): Likewise.
      
      	* integrate.c (get_hard_reg_initial_val): Likewise.
      
      	* gimple.c (gimple_alloc_stat): Likewise.
      	(gimple_build_omp_for): Likewise.
      	(gimple_seq_alloc): Likewise.
      	(gimple_copy): Likewise.
      
      	* gimple-iterator.c (gsi_insert_before_without_update): Likewise.
      	(gsi_insert_after_without_update): Likewise.
      
      	* function.c (add_frame_space): Likewise.
      	(insert_temp_slot_address): Likewise.
      	(assign_stack_temp_for_type): Likewise.
      	(allocate_struct_function): Likewise.
      	(types_used_by_var_decl_insert): Likewise.
      
      	* except.c (init_eh_for_function): Likewise.
      	(gen_eh_region): Likewise.
      	(gen_eh_region_catch): Likewise.
      	(gen_eh_landing_pad): Likewise.
      	(add_call_site): Likewise.
      
      	* emit-rtl.c (get_mem_attrs): Likewise.
      	(get_reg_attrs): Likewise.
      	(start_sequence): Likewise.
      	(init_emit): Likewise.
      
      	* dwarf2out.c (new_cfi): Likewise.
      	(queue_reg_save): Likewise.
      	(dwarf2out_frame_init): Likewise.
      	(new_loc_descr): Likewise.
      	(find_AT_string): Likewise.
      	(new_die): Likewise.
      	(add_var_loc_to_decl): Likewise.
      	(clone_die): Likewise.
      	(clone_as_declaration): Likewise.
      	(break_out_comdat_types): Likewise.
      	(new_loc_list): Likewise.
      	(loc_descriptor): Likewise.
      	(add_loc_descr_to_each): Likewise.
      	(add_const_value_attribute): Likewise.
      	(tree_add_const_value_attribute): Likewise.
      	(add_comp_dir_attribute): Likewise.
      	(add_name_and_src_coords_attributes): Likewise.
      	(lookup_filename): Likewise.
      	(store_vcall_insn): Likewise.
      	(dwarf2out_init): Likewise.
      
      	* dbxout.c (dbxout_init): Likewise.
      
      	* config/xtensa/xtensa.c (xtensa_init_machine_status): Likewise.
      
      	* config/sparc/sparc.c (sparc_init_machine_status): Likewise.
      
      	* config/score/score7.c (score7_output_external): Likewise.
      
      	* config/score/score3.c (score3_output_external): Likewise.
      
      	* config/s390/s390.c (s390_init_machine_status): Likewise.
      
      	* config/rs6000/rs6000.c (builtin_function_type): Likewise.
      	(rs6000_init_machine_status): Likewise.
      	(output_toc): Likewise.
      
      	* config/pa/pa.c (pa_init_machine_status): Likewise.
      	(get_deferred_plabel): Likewise.
      
      	* config/moxie/moxie.c (moxie_init_machine_status): Likewise.
      
      	* config/mmix/mmix.c (mmix_init_machine_status): Likewise.
      
      	* config/mips/mips.c (mflip_mips16_use_mips16_p): Likewise.
      
      	* config/mep/mep.c (mep_init_machine_status): Likewise.
      	(mep_note_pragma_flag): Likewise.
      
      	* config/m32c/m32c.c (m32c_init_machine_status): Likewise.
      
      	* config/iq2000/iq2000.c (iq2000_init_machine_status): Likewise.
      
      	* config/ia64/ia64.c (ia64_init_machine_status): Likewise.
      
      	* config/i386/winnt.c (i386_pe_record_external_function): Likewise.
      	(i386_pe_maybe_record_exported_symbol): Likewise.
      
      	* config/i386/i386.c (get_dllimport_decl): Likewise.
      	(ix86_init_machine_status): Likewise.
      	(assign_386_stack_local): Likewise.
      
      	* config/frv/frv.c (frv_init_machine_status): Likewise.
      
      	* config/darwin.c (machopic_indirection_name): Likewise.
      
      	* config/cris/cris.c (cris_init_machine_status): Likewise.
      
      	* config/bfin/bfin.c (bfin_init_machine_status): Likewise.
      
      	* config/avr/avr.c (avr_init_machine_status): Likewise.
      
      	* config/arm/arm.c (arm_init_machine_status): Likewise.
      
      	* config/alpha/alpha.c (alpha_init_machine_status): Likewise.
      	(alpha_need_linkage): Likewise.
      	(alpha_use_linkage): Likewise.
      
      	* cgraph.c (cgraph_allocate_node): Likewise.
      	(cgraph_create_edge_1): Likewise.
      	(cgraph_create_indirect_edge): Likewise.
      	(cgraph_add_asm_node): Likewise.
      
      	* cfgrtl.c (init_rtl_bb_info): Likewise.
      
      	* cfgloop.c (alloc_loop): Likewise.
      	(rescan_loop_exit): Likewise.
      
      	* cfg.c (init_flow): Likewise.
      	(alloc_block): Likewise.
      	(unchecked_make_edge): Likewise.
      
      	* c-parser.c (c_parse_init): Likewise.
      	(c_parse_file): Likewise.
      
      	* c-decl.c (bind): Likewise.
      	(record_inline_static): Likewise.
      	(push_scope): Likewise.
      	(make_label): Likewise.
      	(lookup_label_for_goto): Likewise.
      	(finish_struct): Likewise.
      	(finish_enum): Likewise.
      	(c_push_function_context): Likewise.
      
      	* bitmap.c (bitmap_element_allocate): Likewise.
      	(bitmap_gc_alloc_stat): Likewise.
      
      	* alias.c (record_alias_subset): Likewise.
      	(init_alias_analysis): Likewise.
      
      include:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* splay-tree.h: Update copyright years.
      	(splay_tree_s): Document fields.
      	(splay_tree_new_typed_alloc): New.
      
      	* hashtab.h: Update copyright years.
      	(htab_create_typed_alloc): New.
      
      libcpp:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* include/symtab.h (ht_identifier_ptr): New.
      
      libiberty:
      
      2010-06-08  Laurynas Biveinis  <laurynas.biveinis@gmail.com>
      
      	* splay-tree.c: Update copyright years.
      	(splay_tree_new_typed_alloc): New.
      	(splay_tree_new_with_allocator): Use it.
      
      	* hashtab.c: Update copyright years.
      	(htab_create_typed_alloc): New.
      	(htab_create_alloc): Use it.
      
      	* functions.texi: Regenerate.
      
      From-SVN: r160425
      a9429e29
  31. Jun 02, 2010
  32. May 26, 2010
  33. Apr 26, 2010
  34. Apr 24, 2010
    • Pedro Alves's avatar
      filenames.h (IS_DIR_SEPARATOR_1): Rename from IS_DIR_SEPARATOR... · 3009276c
      Pedro Alves authored
      2010-04-23  Pedro Alves  <pedro@codesourcery.com>
      
      include/
      * filenames.h (IS_DIR_SEPARATOR_1): Rename from IS_DIR_SEPARATOR,
      always define it independently of host, add `dos_based' parameter,
      and handle it.
      (HAS_DRIVE_SPEC_1): Rename from HAS_DRIVE_SPEC, always define it
      independently of host, add `dos_based' parameter, and handle it.
      (IS_ABSOLUTE_PATH_1): Rename from IS_ABSOLUTE_PATH, always define
      it independently of host, add `dos_based' parameter, and handle
      it.
      (IS_DOS_DIR_SEPARATOR, IS_DOS_ABSOLUTE_PATH)
      (IS_UNIX_DIR_SEPARATOR, IS_UNIX_ABSOLUTE_PATH)
      (HAS_DOS_DRIVE_SPEC): New.
      (HAS_DRIVE_SPEC): Reimplement on top of HAS_DRIVE_SPEC_1.
      (IS_DIR_SEPARATOR): Reimplement on top of IS_DIR_SEPARATOR_1.
      (IS_ABSOLUTE_PATH): Reimplement on top of IS_ABSOLUTE_PATH_1.
      * libiberty.h (dos_lbasename, unix_lbasename): Declare.
      
      libiberty/
      * lbasename.c (lbasename): Split into ...
      (unix_lbasename, dos_basename): ... these.
      (lbasename): ... and reimplement on top of them.
      * Makefile.in (lbasename.o): Add dependency on
      $(INCDIR)/filenames.h.
      
      From-SVN: r158681
      3009276c
  35. Apr 20, 2010
Loading