Skip to content
Snippets Groups Projects
  1. Jul 05, 2005
    • Paolo Carlini's avatar
      Add class __versa_string, a versatile "basic_string-type" class... · 872d8fea
      Paolo Carlini authored
      2005-07-05  Paolo Carlini  <pcarlini@suse.de>
      
      	Add class __versa_string, a versatile "basic_string-type" class:
      	an additional, non-standard, template parameter allows to specify
      	the preferred base class. Two are provided: __rc_string_base,
      	which implements a behavior very similar to our standard string,
      	and __sso_string_base, not reference-counted and optimized for
      	short strings.
      	* include/ext/rc_string_base.h: New.
      	* include/ext/sso_string_base.h: Likewise.
      	* include/ext/vstring.h: Likewise.
      	* include/ext/vstring.tcc: Likewise.
      	* include/ext/vstring_fwd.h: Likewise.
      	* include/ext/vstring_util.h: Likewise.
      	* include/Makefile.am: Add.
      	* include/Makefile.in: Regenerate.
      	* testsuite/ext/vstring/explicit_instantiation/1.cc: New.
      	* testsuite/ext/vstring/explicit_instantiation/2.cc: Likewise.
      	* testsuite/ext/vstring/explicit_instantiation/char/1.cc: Likewise.
      	* testsuite/ext/vstring/explicit_instantiation/wchar_t/1.cc: Likewise.
      
      	* Makefile.in: Regenerate with autotools 1.9.3 (to date, the version
      	officially used by v3).
      	* aclocal.m4: Likewise.
      	* libmath/Makefile.in: Likewise.
      	* libsupc++/Makefile.in: Likewise.
      	* po/Makefile.in: Likewise.
      	* src/Makefile.in: Likewise.
      	* testsuite/Makefile.in: Likewise.
      
      From-SVN: r101639
      872d8fea
    • Andrew Pinski's avatar
      Makefile.in (final.o): Fix dependencies. · 83522e18
      Andrew Pinski authored
      2005-07-05  Andrew Pinski  <pinskia@physics.uc.edu>
      
              * Makefile.in (final.o): Fix dependencies.
      
      From-SVN: r101638
      83522e18
    • Bryce McKinlay's avatar
      re PR java/19674 (Empty declaration through semicolon (;) causes compile failure) · b226520a
      Bryce McKinlay authored
      2005-07-05  Bryce McKinlay  <mckinlay@redhat.com>
      
              PR java/19674
              * parse.y (interface_member_declaration): Allow empty statements in
              interface declarations.
      
      2005-07-05  Bryce McKinlay  <mckinlay@redhat.com>
      
      	* testsuite/libjava.compile/PR19674.java: New test.
      
      From-SVN: r101634
      b226520a
    • Joseph Myers's avatar
      re PR c/22013 (ICE in gimple_add_tmp_var, at gimplify.c:535) · 73f397d4
      Joseph Myers authored
      	PR c/22013
      	PR c/22098
      	* langhooks.h (struct lang_hooks): Add expr_to_decl.
      	* langhooks.c (lhd_expr_to_decl): New.
      	* langhooks-def.h (lhd_expr_to_decl, LANG_HOOKS_EXPR_TO_DECL):
      	New.
      	(LANG_HOOKS_INITIALIZER): Update.
      	* tree.c (recompute_tree_invarant_for_addr_expr): Call
      	expr_to_decl langhook.
      	* c-tree.h (c_expr_to_decl): Declare.
      	* c-typeck.c (c_expr_to_decl): New.
      	(build_unary_op): Do not handle ADDR_EXPR of COMPOUND_LITERAL_EXPR
      	specially.
      	* c-objc-common.h (LANG_HOOKS_EXPR_TO_DECL): Define.
      
      testsuite:
      	* gcc.c-torture/compile/pr22013-1.c,
      	gcc.c-torture/execute/pr22098-1.c,
      	gcc.c-torture/execute/pr22098-2.c,
      	gcc.c-torture/execute/pr22098-3.c: New tests.
      
      From-SVN: r101630
      73f397d4
    • Joseph Myers's avatar
      re PR c/22308 (Failure to diagnose violation of constraint 6.516p2) · 692a7aa3
      Joseph Myers authored
      	PR c/22308
      	* c-decl.c (finish_struct): Also copy C_TYPE_FIELDS_READONLY,
      	C_TYPE_FIELDS_VOLATILE and C_TYPE_VARIABLE_SIZE to type variants.
      
      testsuite:
      	* gcc.dg/pr22308-1.c: New test.
      
      From-SVN: r101629
      692a7aa3
    • Aaron Luchko's avatar
      StringReferenceCommandSet.java: New file. · 2d95cce3
      Aaron Luchko authored
              * gnu/classpath/jdwp/processor/StringReferenceCommandSet.java:
              New file.
      
      From-SVN: r101628
      2d95cce3
    • Paolo Bonzini's avatar
      Makefile.in: Adjust dependencies. · ef330312
      Paolo Bonzini authored
      2005-07-05  Paolo Bonzini  <bonzini@gnu.org>
      
      	* Makefile.in: Adjust dependencies.
      	* tree-pass.h: Add new passes and passes formerly in tree-optimize.c.
      	* basic-block.h (duplicate_computed_gotos): Remove, it is now static.
      	* alias.c (rest_of_handle_cfg, pass_cfg): New.
      	* bb-reorder.c (duplicate_computed_gotos): Make it static.
      	* cfgexpand.c (tree_expand_cfg): Add code formerly at the beginning of
      	rest_of_compilation.
      
      	* bb-reorder.c (gate_duplicate_computed_gotos,
      	pass_duplicate_computed_gotos, gate_handle_reorder_blocks,
      	rest_of_handle_reorder_blocks, pass_reorder_blocks,
      	gate_handle_partition_blocks, rest_of_handle_partition_blocks,
      	pass_partition_blocks): New.
      	* bt-load.c (gate_handle_branch_target_load_optimize,
      	rest_of_handle_branch_target_load_optimize,
      	pass_branch_target_load_optimize): New.
      	* cfgcleanup.c (rest_of_handle_jump, pass_jump, rest_of_handle_jump2,
      	pass_jump2): New.
      	* cfglayout.c (pass_insn_locators_initialize): New.
      	* cfgrtl.c (pass_free_cfg): New.
      	* combine.c (gate_handle_combine, rest_of_handle_combine,
      	pass_combine): New.
      	* cse.c (gate_handle_cse, rest_of_handle_cse, pass_cse,
      	gate_handle_cse2, rest_of_handle_cse2, pass_cse2): New.
      	* emit-rtl.c (pass_unshare_all_rtl, pass_remove_unnecessary_notes): New.
      	* except.c (pass_set_nothrow_function_flags,
      	pass_convert_to_eh_region_ranges, gate_handle_eh, rest_of_handle_eh,
      	pass_rtl_eh): New.
      	* final.c (pass_compute_alignments, rest_of_handle_final, pass_final,
      	rest_of_handle_shorten_branches, pass_shorten_branches,
      	rest_of_clean_state, pass_clean_state): New.
      	* flow.c (pass_recompute_reg_usage, gate_remove_death_notes,
      	rest_of_handle_remove_death_notes, pass_remove_death_notes,
      	rest_of_handle_life, pass_life, rest_of_handle_flow2,
      	pass_flow2): New.
      	* function.c (pass_instantiate_virtual_regs, pass_init_function,
      	rest_of_handle_check_leaf_regs, pass_leaf_regs): New.
      	* gcse.c (gate_handle_jump_bypass, rest_of_handle_jump_bypass,
      	pass_jump_bypass, gate_handle_gcse, rest_of_handle_gcse,
      	pass_gcse): New.
      	* global.c (rest_of_handle_global_alloc, pass_global_alloc): New.
      	* ifcvt.c (gate_handle_if_conversion, rest_of_handle_if_conversion,
      	pass_rtl_ifcvt, gate_handle_if_after_combine,
      	rest_of_handle_if_after_combine, pass_if_after_combine,
      	gate_handle_if_after_reload, rest_of_handle_if_after_reload,
      	pass_if_after_reload): New.
      	* integrate.c (pass_initial_value_sets): New.
      	* jump.c (pass_cleanup_barriers, purge_line_number_notes,
      	pass_purge_lineno_notes): New.
      	* mode-switching.c (rest_of_handle_mode_switching,
      	pass_mode_switching): New.
      	* local-alloc.c (rest_of_handle_local_alloc, pass_local_alloc): New.
      	* loop-init.c (gate_handle_loop2, rest_of_handle_loop2,
      	pass_loop2): New.
      	* loop.c (gate_handle_loop_optimize, rest_of_handle_loop_optimize,
      	pass_loop_optimize): New.
      	* modulo-sched.c (gate_handle_sms, rest_of_handle_sms,
      	pass_sms): New.
      	* postreload-gcse.c (gate_handle_gcse2, rest_of_handle_gcse2,
      	pass_gcse2): New.
      	* postreload.c (gate_handle_postreload, rest_of_handle_postreload,
      	pass_postreload_cse): New.
      	* profile.c (gate_handle_profiling, pass_profiling,
      	rest_of_handle_branch_prob, pass_branch_prob): New.
      	* recog.c (pass pass_split_for_shorten_branches, gate_do_final_split,
      	pass_split_before_regstack, gate_handle_split_before_regstack,
      	gate_handle_peephole2, rest_of_handle_peephole2, pass_peephole2,
      	rest_of_handle_split_all_insns, pass_split_all_insns): New.
      	* reg-stack.c (gate_handle_stack_regs, rest_of_handle_stack_regs,
      	pass_stack_regs): New.
      	* regmove.c (gate_handle_regmove, rest_of_handle_regmove, pass_regmove,
      	gate_handle_stack_adjustments, rest_of_handle_stack_adjustments,
      	pass_stack_adjustments): New.
      	* regrename.c (gate_handle_regrename, rest_of_handle_regrename,
      	pass_regrename): New.
      	* reorg.c (gate_handle_delay_slots, rest_of_handle_delay_slots,
      	pass_delay_slots, gate_handle_machine_reorg,
      	rest_of_handle_machine_reorg, pass_machine_reorg): New.
      	* rtl.h (extern void purge_line_number_notes): New.
      	* sched-rgn.c (gate_handle_sched, rest_of_handle_sched,
      	gate_handle_sched2, rest_of_handle_sched2, pass_sched,
      	pass_sched2): New.
      	* tracer.c (gate_handle_tracer, rest_of_handle_tracer,
      	pass_tracer): New.
      	* value-prof.c (gate_handle_value_profile_transformations,
      	rest_of_handle_value_profile_transformations,
      	pass_value_profile_transformations): New.
      	* var-tracking.c (gate_handle_var_tracking,
      	pass_variable_tracking): New.
      	* web.c (gate_handle_web, rest_of_handle_web, pass_web): New.
      
      	* passes.c (open_dump_file, close_dump_file, rest_of_handle_final,
      	rest_of_handle_delay_slots, rest_of_handle_stack_regs,
      	rest_of_handle_variable_tracking, rest_of_handle_machine_reorg,
      	rest_of_handle_old_regalloc, rest_of_handle_regrename,
      	rest_of_handle_reorder_blocks, rest_of_handle_partition_blocks,
      	rest_of_handle_sms, rest_of_handle_sched, rest_of_handle_sched2,
      	rest_of_handle_gcse2, rest_of_handle_regmove,
      	rest_of_handle_tracer, rest_of_handle_if_conversion,
      	rest_of_handle_if_after_combine, rest_of_handle_if_after_reload,
      	rest_of_handle_web, rest_of_handle_branch_prob,
      	rest_of_handle_value_profile_transformations, rest_of_handle_cfg,
      	rest_of_handle_jump_bypass, rest_of_handle_combine,
      	rest_of_handle_life, rest_of_handle_cse, rest_of_handle_cse2,
      	rest_of_handle_gcse, rest_of_handle_loop_optimize,
      	rest_of_handle_loop2, rest_of_handle_branch_target_load_optimize,
      	rest_of_handle_mode_switching, rest_of_handle_jump,
      	rest_of_handle_eh, rest_of_handle_stack_adjustments,
      	rest_of_handle_flow2, rest_of_handle_jump2,
      	rest_of_handle_peephole2, rest_of_handle_postreload,
      	rest_of_handle_shorten_branches, rest_of_clean_state,
      	rest_of_compilation): Remove.
      
      	* cgraphunit.c (ipa_passes): Moved from tree-optimize.c.
      	* passes.c (dump_flags, in_gimple_form, all_passes,
      	all_ipa_passes, all_lowering_passes, register_one_dump_file,
      	register_dump_files, next_pass_1, last_verified, execute_todo,
      	execute_one_pass, execute_pass_list, execute_ipa_pass_list): Moved
      	from tree-optimize.c.
      	(init_optimization_passes): Moved from tree-optimize.c,
      	adding the RTL optimizations.
      	* tree-dump.h (dump_info_p, dump_flag): Moved from tree.h.
      	* tree-optimize.c (dump_flags, in_gimple_form, all_passes,
      	all_ipa_passes, all_lowering_passes, register_one_dump_file,
      	register_dump_files, next_pass_1, last_verified, execute_todo,
      	execute_one_pass, execute_pass_list, execute_ipa_pass_list,
      	init_tree_optimization_passes, ipa_passes): Delete.
      	* tree-pass.h (enum tree_dump_index): Moved from tree.h, removing
      	the RTL dumps.
      	(TDF_*, get_dump_file_name, dump_enabled_p, dump_initialized_p,
      	dump_begin, dump_end, dump_node, dump_switch_p, dump_flag_name): Moved
      	from tree.h.
      	(ipa_passes): Remove.
      	(all_passes, all_ipa_passes, all_lowering_passes): Now extern.
      	* tree.h (enum tree_dump_index, TDF_*, get_dump_file_name,
      	dump_enabled_p, dump_initialized_p, dump_begin, dump_end, dump_node,
      	dump_switch_p, dump_flag_name): Moved to tree-pass.h.
      	(dump_info_p, dump_flag): Moved to tree-dump.h.
      
      	* Makefile.in: Adjust dependencies for tree-pretty-print.c,
      	cgraph.c, opts.c.
      	* passes.c (finish_optimization_passes): Use dump_begin
      	and dump_end, TDI_end.
      	(gate_rest_of_compilation): New.
      	(pass_rest_of_compilation): Use it.
      	(gate_postreload, pass_postreload): New.
      	* toplev.c (general_init): Rename init_tree_optimization_passes.
      	* toplev.h (init_tree_optimization_passes): Rename to
      	init_optimizations_passes.
      	* tree-dump.c (dump_flag): Make static.
      	(dump_files): Remove RTL dumps.
      	* tree-optimize.c (pass_all_optimizations, pass_early_local_passes,
      	pass_cleanup_cfg, pass_free_cfg_annotations,
      	pass_cleanup_cfg_post_optimizing, pass_free_datastructures,
      	pass_init_datastructures, pass_fixup_cfg): Make non-static.
      	* tree-pretty-print.c: Include tree-pass.h.
      	* cgraph.c: Include tree-dump.h.
      
      cp:
      2005-07-05  Paolo Bonzini  <bonzini@gnu.org>
      
      	* Makefile.in (class.o, decl2.o): Adjust dependencies.
      	* class.c: Include tree-dump.h.
      	* decl2.c: Include tree-dump.h.
      
      java:
      2005-07-05  Paolo Bonzini  <bonzini@gnu.org>
      
      	* Makefile.in (parse.o): Adjust dependencies.
      	* parse.y: Include tree-dump.h.
      
      From-SVN: r101627
      ef330312
    • Daniel Berlin's avatar
      tree-ssa-structalias.c (get_constraint_exp_from_ssa_var): Only fall back to... · 47bcb538
      Daniel Berlin authored
      tree-ssa-structalias.c (get_constraint_exp_from_ssa_var): Only fall back to saying it points to readonly memory if we can't do better.
      
      2005-07-04  Daniel Berlin  <dberlin@dberlin.org>
      
      	* tree-ssa-structalias.c (get_constraint_exp_from_ssa_var):
      	Only fall back to saying it points to readonly memory if
      	we can't do better.
      
      From-SVN: r101625
      47bcb538
    • Kazuhiro Inaoka's avatar
      m32r-protos.h: Remove m32r_finalize_pic. · cdc9bfe6
      Kazuhiro Inaoka authored
      	* config/m32r/m32r-protos.h: Remove m32r_finalize_pic.
      	* config/m32r/m32r.c (m32r_compute_frame_size,
      	m32r_expand_prologue): Take current_function_profile into
      	account whenever we reference
      	current_function_uses_pic_offset_table.
      	(m32r_finalize_pic): Remove.
      	* config/m32r/m32r.h (FINALIZE_PIC): Likewise.
      
      From-SVN: r101624
      cdc9bfe6
    • Paolo Bonzini's avatar
      ChangeLog for January-June 2005 rotated into ChangeLog-2005. · 064be445
      Paolo Bonzini authored
      From-SVN: r101623
      064be445
    • Kazu Hirata's avatar
      Makefile.in (stamp-as): Use $(ORIGINAL_AS_FOR_TARGET) instead of $<. · 96f52752
      Kazu Hirata authored
      	* Makefile.in (stamp-as): Use $(ORIGINAL_AS_FOR_TARGET)
      	instead of $<.  Don't remove ./as if it already exists.
      
      From-SVN: r101621
      96f52752
    • Kazu Hirata's avatar
      Makefile.in (stamp-as): Use $(ORIGINAL_AS_FOR_TARGET) instead of $<. · e21ba931
      Kazu Hirata authored
      	* Makefile.in (stamp-as): Use $(ORIGINAL_AS_FOR_TARGET)
      	instead of $<.  Don't remove ./as if it already exists.
      
      From-SVN: r101620
      e21ba931
    • Eric Botcazou's avatar
      Add due credit. · 9bae2797
      Eric Botcazou authored
      From-SVN: r101619
      9bae2797
    • John David Anglin's avatar
      re PR target/21723 (ICE while building libgfortran) · 47971fa7
      John David Anglin authored
      	PR target/21723
      	* pa.md: Remove fcpy alternative from movhi and movqi patterns.
      	* pa32-regs.h (HARD_REGNO_NREGS): Return two floating point registers
      	for complex modes when generating code for PA 1.0.
      	(VALID_FP_MODE_P): New macro.
      	(HARD_REGNO_MODE_OK): Use VALID_FP_MODE_P.  Use non-overlapping register
      	sets for all general and floating point modes.  Align wide floating
      	point modes to even register boundaries to comply with architectural
      	requirements.
      	(CLASS_MAX_NREGS): Update to align with change to HARD_REGNO_NREGS.
      	* pa64-regs.h (HARD_REGNO_NREGS): Update comment and formatting.
      	(VALID_FP_MODE_P): New macro.
      	(HARD_REGNO_MODE_OK): Use VALID_FP_MODE_P.  Use non-overlapping register
      	sets for all general and floating point modes.  Align wide floating
      	point modes to even register boundaries to comply with architectural
      	requirements.
      
      From-SVN: r101613
      47971fa7
    • Diego Novillo's avatar
      tree-dump.c (dump_files): Initialize dump number for .cgraph to 0. · f94ac7b6
      Diego Novillo authored
      	* tree-dump.c (dump_files): Initialize dump number for .cgraph
      	to 0.
      
      From-SVN: r101612
      f94ac7b6
    • Kazu Hirata's avatar
      compare1.c: Add -fno-short-enums. · 3d7686f9
      Kazu Hirata authored
      	* gcc.dg/compare1.c: Add -fno-short-enums.  Don't skip on any
      	target.
      	* gcc.dg/compare9.c: Use -fshort-enums instead of
      	-fno-short-enums.  Change the last test to dg-bogus.
      
      From-SVN: r101611
      3d7686f9
    • Kazu Hirata's avatar
      compare1.c: Add -fno-short-enums. · 5935bec3
      Kazu Hirata authored
      	* gcc.dg/compare1.c: Add -fno-short-enums.  Don't skip on any
      	target.
      	* gcc.dg/compare9.c: Use -fshort-enums instead of
      	-fshort-enums.  Change the last test to dg-bogus.
      
      From-SVN: r101610
      5935bec3
    • Diego Novillo's avatar
      * tree-ssa-structalias.c: Don't include expr.h. · 4e89ef6b
      Diego Novillo authored
      From-SVN: r101609
      4e89ef6b
    • GCC Administrator's avatar
      Daily bump. · 4b7c5b3a
      GCC Administrator authored
      [[Split portion of a mixed commit.]]
      
      From-SVN: r101607.2
      4b7c5b3a
  2. Jul 04, 2005
    • Diego Novillo's avatar
      tree-iterator.h (TSI_NEW_STMT, [...]): Fix comments. · 00b847e3
      Diego Novillo authored
      	* tree-iterator.h (TSI_NEW_STMT, TSI_SAME_STMT): Fix
      	comments.
      
      From-SVN: r101605
      00b847e3
    • Kazu Hirata's avatar
      compare1.c: Skip on arm*-*-eabi* arm*-*-symbianelf*. · c6f3fbf1
      Kazu Hirata authored
      	* gcc.dg/compare1.c: Skip on arm*-*-eabi* arm*-*-symbianelf*.
      	* gcc.dg/compare9.c: New.
      
      From-SVN: r101604
      c6f3fbf1
    • Daniel Berlin's avatar
      re PR tree-optimization/22279 (ICE in first_vi_for_offset, at tree-ssa-structalias.c:2566) · 2238c11d
      Daniel Berlin authored
      2005-07-04  Daniel Berlin  <dberlin@dberlin.org>
      
      	Fix PR tree-optimization/22279
      
      	* tree-ssa-structalias.c (offset_overlaps_with_access): Use
      	correct operator.
      
      From-SVN: r101603
      2238c11d
    • Francois-Xavier Coudert's avatar
      * gfortran.dg/io_invalid_1.f90: Fix expected error message. · 0f8417e9
      Francois-Xavier Coudert authored
      From-SVN: r101602
      0f8417e9
    • Aaron Luchko's avatar
      CommandSet.java: New file. · 3bea4ad0
      Aaron Luchko authored
              * gnu/classpath/jdwp/processor/CommandSet.java: New file.
              * gnu/classpath/jdwp/processor/PacketProcessor.java: Use
              CommandSets to handle JdwpCommandPackets.
              * gnu/classpath/jdwp/transport/JdwpReplyPacket.java: New
              Constructor.
      
      From-SVN: r101601
      3bea4ad0
    • J"orn Rennecke's avatar
      * sh.c (output_ieee_ccmpeq): Replace "\\;" with "\n\t". · 9fd0c419
      J"orn Rennecke authored
      From-SVN: r101600
      9fd0c419
    • Arnaud Charlet's avatar
      resync · 7d300a99
      Arnaud Charlet authored
      From-SVN: r101599
      7d300a99
    • Arnaud Charlet's avatar
      [multiple changes] · 4edb2be0
      Arnaud Charlet authored
      2005-07-04  Richard Kenner  <kenner@vlsi1.ultra.nyu.edu>
      	    Thomas Quinot  <quinot@adacore.com>
      
      	* Make-lang.in: (ada/targtyps.o): Add missing TREE_H dependency.
      	new target gen-soccon.
      
      2005-07-04  Robert Dewar  <dewar@adacore.com>
      
      	* s-mastop-irix.adb, s-mastop-vms.adb: Minor reformatting
      
      2005-07-04  Thomas Quinot  <quinot@adacore.com>
      
      	* g-socket.ads (Check_Selector): Minor rewording of comment.
      
      2005-07-04  Vincent Celier  <celier@adacore.com>
      
      	* vms_data.ads: Add VMS qualifiers for new gnatpp switch --eol=
      
      2005-07-04  Thomas Quinot  <quinot@adacore.com>
      
      	* gen-soccon.c: Add constants SO_SNDTIMEO and SO_RCVTIMEO.
      
      2005-07-04  Sergey Rybin  <rybin@adacore.com>
      
              * gnat_ugn.texi: Add description of --eol gnatpp option
      
      2005-07-04  Eric Botcazou  <ebotcazou@adacore.com>
      	    Thomas Quinot  <quinot@adacore.com>
      
              * gnat_rm.texi: Add a note that pragma Unreferenced is not appropriate
      	if the user wants all calls of a subprogram to be flagged,
      	independently of whether they are made from within the same unit or
      	another unit.
              Mention restriction for pragma Linker_Alias on some platforms.
              Document pragma Linker_Constructor and Linker_Destructor.
              Rewrite documentation of Weak_External, Linker_Section and
              Linker_Alias pragmas.
      
      From-SVN: r101598
      4edb2be0
    • Matthew Heaney's avatar
      a-convec.ads, [...]: Declaration of subtype Extended_Index was changed. · d43d5ef7
      Matthew Heaney authored
      2005-07-04  Matthew Heaney  <heaney@adacore.com>
      
      	* a-convec.ads, a-coinve.ads: Declaration of subtype Extended_Index
      	was changed.
      	* a-coinve.adb: Perform constraint checks explicitly.
      
      From-SVN: r101597
      d43d5ef7
    • Vincent Celier's avatar
      makegpr.adb (Build_Global_Archive): Make sure the list of sources is correctly... · c8effb4f
      Vincent Celier authored
      makegpr.adb (Build_Global_Archive): Make sure the list of sources is correctly computed and the main project data...
      
      2005-07-04  Vincent Celier  <celier@adacore.com>
      
      	* makegpr.adb (Build_Global_Archive): Make sure the list of sources is
      	correctly computed and the main project data is not modified while
      	doing so.
      	(Add_C_Plus_Plus_Link_For_Gnatmake): Always link with the C++ compiler
      	(Choose_C_Plus_Plus_Link_Process): Do not generate shell script
      	c++linker as this does not work on some platforms.
      
      From-SVN: r101596
      c8effb4f
    • Vincent Celier's avatar
      vms_conv.adb (Initialize): Allow multiple ALI files to be given to the GNAT BIND command... · 65d5180d
      Vincent Celier authored
      2005-07-04  Vincent Celier  <celier@adacore.com>
      
      	* vms_conv.adb (Initialize): Allow multiple ALI files to be given to
      	the GNAT BIND command, as gnatbind accepts multiples ALI files with
      	the -L or -n switches.
      
      From-SVN: r101595
      65d5180d
    • Matthew Gingell's avatar
      tracebak.c: Enable tracebacks on ia64 platforms · 55d43609
      Matthew Gingell authored
      2005-07-04  Matthew Gingell  <gingell@adacore.com>
      
      	* tracebak.c: Enable tracebacks on ia64 platforms
      
      From-SVN: r101594
      55d43609
    • Robert Dewar's avatar
      re PR ada/22039 (special functions for string concat of 3/4/5 args doc'ed to concat two) · ef82b92b
      Robert Dewar authored
      2005-07-04  Robert Dewar  <dewar@adacore.com>
      
      	PR ada/22039
      
      	* s-sopco3.ads, s-sopco4.ads, s-sopco5.ads: Minor documentation fix
      
      From-SVN: r101593
      ef82b92b
    • Ed Schonberg's avatar
      sem_util.adb (Is_Object_Reference): An indexed or selected component whose... · ac0ed726
      Ed Schonberg authored
      sem_util.adb (Is_Object_Reference): An indexed or selected component whose prefix is an implicit dereference is an...
      
      2005-07-04  Ed Schonberg  <schonberg@adacore.com>
      
      	* sem_util.adb (Is_Object_Reference): An indexed or selected component
      	whose prefix is an implicit dereference is an object reference. Removes
      	spurious errors when compiling with -gnatc.
      
      From-SVN: r101592
      ac0ed726
    • Ed Schonberg's avatar
      sem_type.adb (Covers): Verify that Corresponding_Record_Type is present before... · 21ff92b4
      Ed Schonberg authored
      sem_type.adb (Covers): Verify that Corresponding_Record_Type is present before checking whether an...
      
      2005-07-04  Ed Schonberg  <schonberg@adacore.com>
      
      	* sem_type.adb (Covers): Verify that Corresponding_Record_Type is
      	present before checking whether an interface type covers a synchronized
      	type.
      
      From-SVN: r101591
      21ff92b4
    • Thomas Quinot's avatar
      sem_res.adb (Resolve_Actuals): Do not resolve the expression of an actual that... · 16397eff
      Thomas Quinot authored
      sem_res.adb (Resolve_Actuals): Do not resolve the expression of an actual that is a view conversion of a bit...
      
      2005-07-04  Thomas Quinot  <quinot@adacore.com>
      
      	* sem_res.adb (Resolve_Actuals): Do not resolve the expression of an
      	actual that is a view conversion of a bit packed array reference.
      
      From-SVN: r101590
      16397eff
    • Gary Dismukes's avatar
      sem_eval.adb (Subtypes_Statically_Match): Use the discriminant constraint of... · c2bf339e
      Gary Dismukes authored
      sem_eval.adb (Subtypes_Statically_Match): Use the discriminant constraint of full view of a private view T1 if present...
      
      2005-07-04  Gary Dismukes  <dismukes@adacore.com>
      
      	* sem_eval.adb (Subtypes_Statically_Match): Use the discriminant
      	constraint of full view of a private view T1 if present, when T2 is a
      	discriminated full view.
      
      From-SVN: r101589
      c2bf339e
    • Ed Schonberg's avatar
      sem_ch6.adb (Conforming_Types): If the types are anonymous access types check... · 9dcb52e1
      Ed Schonberg authored
      sem_ch6.adb (Conforming_Types): If the types are anonymous access types check whether some designated type is a...
      
      2005-07-04  Ed Schonberg  <schonberg@adacore.com>
      
      	* sem_ch6.adb (Conforming_Types): If the types are anonymous access
      	types check whether some designated type is a limited view, and use
      	the non-limited view if available.
      
      From-SVN: r101588
      9dcb52e1
    • Thomas Quinot's avatar
      sem_ch4.adb (Transform_Object_Operation): For an actual that is an overloaded function call... · d3e65aad
      Thomas Quinot authored
      2005-07-04  Thomas Quinot  <quinot@adacore.com>
      
      	* sem_ch4.adb (Transform_Object_Operation): For an actual that is an
      	overloaded function call, carry interpretations from the original tree
      	to the copy.
      
      From-SVN: r101587
      d3e65aad
    • Ed Schonberg's avatar
      sem_ch10.adb (Build_Limited_Views): A type declared with a private type... · d5f09c91
      Ed Schonberg authored
      sem_ch10.adb (Build_Limited_Views): A type declared with a private type extension needs a limited view.
      
      2005-07-04  Ed Schonberg  <schonberg@adacore.com>
      	    Javier Miranda  <miranda@adacore.com>
      
      	* sem_ch10.adb (Build_Limited_Views): A type declared with a private
      	type extension needs a limited view.
      	Remove previous restriction on private types available through the
      	limited-view (only tagged private types were previously allowed).
      	(Install_Withed_Unit): In the code that implements the
      	legality rule given in AI-377, exclude a child unit with the name
      	Standard, because it is a homonym of the Standard environment package.
      
      From-SVN: r101586
      d5f09c91
    • Robert Dewar's avatar
      scng.adb: Do not consider Mod used as an attribute to be a keyword · 323b59c4
      Robert Dewar authored
      2005-07-04  Robert Dewar  <dewar@adacore.com>
      
      	* scng.adb: Do not consider Mod used as an attribute to be a keyword
      
      From-SVN: r101585
      323b59c4
Loading