Skip to content
Snippets Groups Projects
  1. Apr 09, 2008
    • Jason Merrill's avatar
      re PR c++/35708 (jump to label enters catch block) · df794884
      Jason Merrill authored
              PR c++/35708
              * semantics.c (finish_compound_literal): Return a TARGET_EXPR,
              not a pushed variable.
      
      From-SVN: r134146
      df794884
    • David Edelsohn's avatar
      re PR libstdc++/35597 (libstdc++ -ffunction-sections -fdata-sections disabled on AIX) · ee8f0bd7
      David Edelsohn authored
              PR libstdc++/35597
              * toplev.c (process_options): Remove -ffunction-sections debugging
              warning.
      
      From-SVN: r134143
      ee8f0bd7
    • Samuel Tardieu's avatar
      re PR ada/28305 (GNAT bug when inlining instance of a generic subprogram) · ce4e59c4
      Samuel Tardieu authored
          gcc/ada/
      	PR ada/28305
      	* sem_ch6.adb (Build_Body_To_Inline): Do not save and restore
      	environment if generic instance is a top-level one.
      
          gcc/testsuite/
      	PR ada/28305
      	* gnat.dg/specs/fe_inlining.ads, gnat.dg/specs/fe_inlining_helper.ads,
      	gnat.dg/specs/fe_inlining_helper.adb: New test.
      
      From-SVN: r134142
      ce4e59c4
    • Peter Bergner's avatar
      PR middle-end/PR28690 · 3a3a1fe1
      Peter Bergner authored
      	PR middle-end/PR28690
      	* explow.c (break_out_memory_refs): Use simplify_gen_binary rather
      	than gen_rtx_fmt_ee to perform more canonicalizations.
      
      From-SVN: r134139
      3a3a1fe1
    • Kai Tietz's avatar
      fp-int-convert.h: Use TImode type for x86_64-pc-mingw target. · f5be9e6c
      Kai Tietz authored
      2008-04-09  Kai Tietz  <kai.tietz@onevision.com>
      
      	* gcc.dg/torture/fp-int-convert.h: Use TImode type for 
      	x86_64-pc-mingw target.
      	* gcc.dg/titype-1.c: Likewise.
      
      From-SVN: r134135
      f5be9e6c
    • Richard Sandiford's avatar
      target-supports.exp (check_effective_target_vxworks_kernel): Fix comment. · c6fee227
      Richard Sandiford authored
      	* lib/target-supports.exp (check_effective_target_vxworks_kernel):
      	Fix comment.
      	(check_effective_target_vxworks_rtp): New procedure.
      	* g++.dg/opt/20050511-1.C: Rename UINT32 for VxWorks kernel mode.
      	* g++.dg/warn/miss-format-1.C: XFAIL for VxWorks.
      	* g++.old-deja/g++.abi/cxa_vec.C: XFAIL for VxWorks kernels.
      	* g++.old-deja/g++.brendan/new3.C: Likewise.
      	* g++.old-deja/g++.eh/badalloc1.C: XFAIL for VxWorks RTPs.
      	* g++.old-deja/g++.law/missed-error2.C: Undefine max for
      	VxWorks kernel mode.
      	* g++.old-deja/g++.mike/init1.C: XFAIL for VxWorks kernel mode.
      	* g++.old-deja/g++.mike/p2736.C: Likewise.
      	* g++.old-deja/g++.mike/p658.C: Undefine OK for VxWorks kernel mode.
      	* g++.old-deja/g++.other/headers1.C: Likewise min and max.
      	* g++.old-deja/g++.robertl/eb79.C: Undefine max for VxWorks
      	kernel mode.
      
      From-SVN: r134134
      c6fee227
    • Jakub Jelinek's avatar
      list_read.c (snprintf): Define if HAVE_SNPRINTF isn't defined. · 24722ea9
      Jakub Jelinek authored
      	* io/list_read.c (snprintf): Define if HAVE_SNPRINTF isn't defined.
      	(nml_read_obj): Add nml_err_msg_size argument.  Pass it down to
      	recursive call.  Use snprintf instead of sprintf when %s nl->var_name
      	is used.
      	(nml_get_obj_data): Add nml_err_msg_size argument.  Pass it down to
      	nml_read_obj call.  Use snprintf instead of sprintf when %s
      	nl->var_name is used.  Pass nml_err_msg to nml_parse_qualifier instead
      	of parse_err_msg array.  Append " for namelist variable " and
      	nl->var_name to it.
      	(namelist_read): Increase size of nml_err_msg array to 200.  Pass
      	sizeof nml_err_msg as extra argument to nml_get_obj_data.
      
      	* gfortran.dg/namelist_47.f90: New test.
      
      From-SVN: r134132
      24722ea9
    • Doug Rupp's avatar
      decl.c (validate_size): Set minimum size for fat pointers same as access types. · 6d21c8af
      Doug Rupp authored
      2008-04-09  Doug Rupp  <rupp@adacore.com>
      
      	* decl.c (validate_size): Set minimum size for fat pointers same as
      	access types. Code clean ups.
      
      	* gmem.c (xstrdup32): New macro for 32bit dup on VMS, noop otherwise
      	(__gnat_gmem_a2l_initialize): Dup exename into 32 bit memory on VMS
      
      	* s-auxdec-vms_64.ads, s-auxdec.ads (Short_Address_Size): New constant
      
      	* s-crtl.ads (malloc32) New function, alias for malloc
      	(realloc32) New function, alias for realloc
      
      	* socket.c (__gnat_new_socket_set): Malloc fd_set in 32 bits on VMS
      
      	* utils2.c (build_call_alloc_dealloc): Return call to short malloc if
      	allocator size is 32 and default pointer size is 64.
      	(find_common_type): Document assumption on t1/t2 vs lhs/rhs. Force use of
      	lhs type if smaller, whatever the modes.
      
      	* gigi.h (malloc32_decl): New macro definition
      
      	* utils.c (init_gigi_decls): New malloc32_decl
      	Various code clean ups.
      
      	* s-asthan-vms-alpha.adb (Process_AST.To_Address): Unchecked convert to
      	Task_Address vice System.Address.
      
      	* s-taspri-vms.ads: Import System.Aux_DEC
      	(Task_Address): New subtype of System.Aux_DEC.Short_Address
      	(Task_Address_Size): New constant size of System.Aux_DEC.Short_Address
      
      	* s-asthan-vms-alpha.adb (Process_AST.To_Address): Unchecked convert to
      	Task_Address vice System.Address.
      
      	* s-inmaop-vms.adb: Import System.Task_Primitives
      	(To_Address): Unchecked convert to Task_Address vice System.Address
      
      	* s-taprop-vms.adb (Timed_Delay): Always set the timer even if delay
      	expires now.
      	(To_Task_ID) Unchecked convert from Task_Adddress vice System.Address
      	(To_Address) Unchecked convert to Task_Address vice System.Address
      
      	* s-tpopde-vms.adb: Remove unnecessary warning pragmas
      
      	* g-socthi-vms.ads: Add 32bit size clauses on socket access types.
      
      From-SVN: r134131
      6d21c8af
    • Volker Reichelt's avatar
      call.c (build_op_delete_call): Fix quotation in warning message. · bcac2b89
      Volker Reichelt authored
      	* call.c (build_op_delete_call): Fix quotation in warning message.
      	* decl.c (grokdeclarator): Quote keyword in error message.
      	* pt.c (check_for_bare_parameter_packs): Fix quotation in error
      	message.
      
      From-SVN: r134130
      bcac2b89
    • Volker Reichelt's avatar
      parser.c (cp_parser_check_type_definition): Print error string directly rather than using "%s". · 8b4efb4e
      Volker Reichelt authored
      	* parser.c (cp_parser_check_type_definition): Print error string
      	directly rather than using "%s".
      	(cp_parser_postfix_expression): Fix quotation.
      	(cp_parser_decltype): Likewise.
      	(cp_parser_sizeof_operand): Fix quotation. Simplify.
      
      From-SVN: r134129
      8b4efb4e
    • Volker Reichelt's avatar
      parser.c (cp_parser_non_integral_constant_expression): Build error message... · 2a97bf74
      Volker Reichelt authored
      parser.c (cp_parser_non_integral_constant_expression): Build error message with CONCAT rather than using "%s".
      
      	* parser.c (cp_parser_non_integral_constant_expression): Build error
      	message with CONCAT rather than using "%s".
      	(cp_parser_primary_expression): Fix quotation.
      	(cp_parser_postfix_expression): Likewise.
      	(cp_parser_postfix_dot_deref_expression): Likewise.
      	(cp_parser_unary_expression): Likewise.
      	(cp_parser_new_expression): Likewise.
      	(cp_parser_delete_expression): Likewise.
      
      From-SVN: r134128
      2a97bf74
    • Volker Reichelt's avatar
      parser.c (cp_parser_asm_specification_opt): Print CPP_CLOSE_PAREN as `)', not as `('. · 3a483371
      Volker Reichelt authored
      	* parser.c (cp_parser_asm_specification_opt): Print CPP_CLOSE_PAREN
      	as `)', not as `('.  Fix quotation.
      	(cp_parser_consume_semicolon_at_end_of_statement): Fix quotation.
      	(cp_parser_primary_expression): Likewise.
      	(cp_parser_nested_name_specifier_opt): Likewise.
      	(cp_parser_postfix_expression): Likewise.
      	(cp_parser_postfix_open_square_expression): Likewise.
      	(cp_parser_parenthesized_expression_list): Likewise.
      	(cp_parser_pseudo_destructor_name): Likewise.
      	(cp_parser_new_expression): Likewise.
      	(cp_parser_direct_new_declarator): Likewise.
      	(cp_parser_delete_expression): Likewise.
      	(cp_parser_cast_expression): Likewise.
      	(cp_parser_question_colon_clause): Likewise.
      	(cp_parser_builtin_offsetof): Likewise.
      	(cp_parser_trait_expr): Likewise.
      	(cp_parser_label_for_labeled_statement): Likewise.
      	(cp_parser_compound_statement): Likewise.
      	(cp_parser_selection_statement): Likewise.
      	(cp_parser_condition): Likewise.
      	(cp_parser_iteration_statement): Likewise.
      	(cp_parser_already_scoped_statement): Likewise.
      	(cp_parser_simple_declaration): Likewise.
      	(cp_parser_linkage_specification): Likewise.
      	(cp_parser_static_assert): Likewise.
      	(cp_parser_decltype): Likewise.
      	(cp_parser_conversion_function_id): Likewise.
      	(cp_parser_operator_function_id): Likewise.
      	(cp_parser_operator): Likewise.
      	(cp_parser_type_parameter): Likewise.
      	(cp_parser_template_id): Likewise.
      	(cp_parser_explicit_instantiation): Likewise.
      	(cp_parser_explicit_specialization): Likewise.
      	(cp_parser_enum_specifier): Likewise.
      	(cp_parser_namespace_definition): Likewise.
      	(cp_parser_namespace_alias_definition): Likewise.
      	(cp_parser_using_declaration): Likewise.
      	(cp_parser_using_directive): Likewise.
      	(cp_parser_asm_definition): Likewise.
      	(cp_parser_direct_declarator): Likewise.
      	(cp_parser_ptr_operator): Likewise.
      	(cp_parser_parameter_declaration_clause): Likewise.
      	(cp_parser_initializer_clause): Likewise.
      	(cp_parser_class_specifier): Likewise.
      	(cp_parser_member_specification_opt): Likewise.
      	(cp_parser_member_declaration): Likewise.
      	(cp_parser_pure_specifier): Likewise.
      	(cp_parser_constant_initializer): Likewise.
      	(cp_parser_base_clause): Likewise.
      	(cp_parser_exception_specification_opt): Likewise.
      	(cp_parser_try_block): Likewise.
      	(cp_parser_function_try_block): Likewise.
      	(cp_parser_handler): Likewise.
      	(cp_parser_throw_expression): Likewise.
      	(cp_parser_asm_operand_list): Likewise.
      	(cp_parser_attributes_opt): Likewise.
      	(cp_parser_label_declaration): Likewise.
      	(cp_parser_constructor_declarator_p): Likewise.
      	(cp_parser_template_declaration_after_export): Likewise.
      	(cp_parser_single_declaration): Likewise.
      	(cp_parser_objc_message_expression): Likewise.
      	(cp_parser_objc_message_args): Likewise.
      	(cp_parser_objc_encode_expression): Likewise.
      	(cp_parser_objc_defs_expression): Likewise.
      	(cp_parser_objc_protocol_expression): Likewise.
      	(cp_parser_objc_selector_expression): Likewise.
      	(cp_parser_objc_protocol_refs_opt): Likewise.
      	(cp_parser_objc_typename): Likewise.
      	(cp_parser_objc_method_keyword_params): Likewise.
      	(cp_parser_objc_superclass_or_category): Likewise.
      	(cp_parser_objc_try_catch_finally_statement): Likewise.
      	(cp_parser_objc_synchronized_statement): Likewise.
      	(cp_parser_objc_throw_statement): Likewise.
      	(cp_parser_omp_var_list_no_open): Likewise.
      	(cp_parser_omp_clause_default): Likewise.
      	(cp_parser_omp_clause_if): Likewise.
      	(cp_parser_omp_clause_num_threads): Likewise.
      	(cp_parser_omp_clause_reduction): Likewise.
      	(cp_parser_omp_clause_schedule): Likewise.
      	(cp_parser_omp_critical): Likewise.
      	(cp_parser_omp_for_loop): Likewise.
      	(cp_parser_omp_sections_scope): Likewise.
      
      From-SVN: r134127
      3a483371
    • Volker Reichelt's avatar
      * parser.c (cp_parser_template_parameter_list): Simplify. · de21c145
      Volker Reichelt authored
      From-SVN: r134126
      de21c145
    • GCC Administrator's avatar
      Daily bump. · b72b0eba
      GCC Administrator authored
      From-SVN: r134120
      b72b0eba
    • John David Anglin's avatar
      re PR driver/35665 (FAIL: gfortran.dg/include_2.f90 -O (test for excess error)) · e0941605
      John David Anglin authored
      	PR driver/35665
      	* collect2.c (write_c_file): Don't wrap in "#ifdef __cplusplus".
      
      From-SVN: r134116
      e0941605
  2. Apr 08, 2008
    • Richard Guenther's avatar
      tree-cfg.c (verify_stmt): Print complete bogus stmt. · 2f9ea521
      Richard Guenther authored
      2008-04-09  Richard Guenther  <rguenther@suse.de>
      
      	* tree-cfg.c (verify_stmt): Print complete bogus stmt.
      	(dump_function_to_file): Dump function arguments with types.
      
      	* gfortran.dg/bind_c_usage_14.f03: Adjust.
      
      From-SVN: r134115
      2f9ea521
    • Andy Hutchinson's avatar
      re PR testsuite/35005 (New testcase execute/20071211-1.c assumes 32 bit integers) · a5e34caf
      Andy Hutchinson authored
      	PR target/35005
      	* execute/20071221-1.c: Adapt test for 16 bit int targets.
      	* execute/pr35163.c: Ditto.
      
      From-SVN: r134114
      a5e34caf
    • Richard Guenther's avatar
      fold-const.c (fold_widened_comparison): Do not allow sign-changes that change the result. · 02765a37
      Richard Guenther authored
      2008-04-08  Richard Guenther  <rguenther@suse.de>
      
      	* fold-const.c (fold_widened_comparison): Do not allow
      	sign-changes that change the result.
      
      	* gcc.c-torture/execute/20080408-1.c: New testcase.
      
      From-SVN: r134108
      02765a37
    • Janis Johnson's avatar
      re PR target/35839 (Altivec with the vectorizer causes an ICE in rs6000_check_sdmode) · a0f39282
      Janis Johnson authored
      	PR target/35839
      	* config/rs6000/rs6000.c (rs6000_check_sdmode): Handle additional
      	kinds of indirect references.
      
      From-SVN: r134107
      a0f39282
    • David Edelsohn's avatar
      rs6000.c (rs6000_output_function_epilogue): Update GNU Fortran language string. · 7f62878c
      David Edelsohn authored
              * config/rs6000/rs6000.c (rs6000_output_function_epilogue): Update
              GNU Fortran language string.
      
      From-SVN: r134106
      7f62878c
    • Rafael Avila de Espindola's avatar
      fold-canst.c (tree_call_nonnegative_warnv_p): New. · a1a6e271
      Rafael Avila de Espindola authored
      2008-04-08  Rafael Espindola  <espindola@google.com>
      
      	* fold-canst.c (tree_call_nonnegative_warnv_p): New.
      	(tree_invalid_nonnegative_warnv_p): Use tree_call_nonnegative_warnv_p.
      	* tree.h (tree_call_nonnegative_warnv_p): New.
      
      From-SVN: r134102
      a1a6e271
    • Eric Botcazou's avatar
      gigi.h (standard_datatypes): Add ADT_fdesc_type and ADT_null_fdesc. · 581edf92
      Eric Botcazou authored
      	* gigi.h (standard_datatypes): Add ADT_fdesc_type and ADT_null_fdesc.
      	(fdesc_type_node): Define.
      	(null_fdesc_node): Likewise.
      	* decl.c (gnat_to_gnu_entity) <E_Access_Subprogram_Type>: If the target
      	uses descriptors for vtables and the type comes from a dispatch table,
      	return the descriptor type.
      	* trans.c (Attribute_to_gnu) <Attr_Unrestricted_Access>: If the target
      	uses descriptors for vtables and the type comes from a dispatch table,
      	build a descriptor in the static case and copy the existing one in the
      	non-static case.
      	(gnat_to_gnu) <N_Null>: If the target uses descriptors for vtables and
      	the type is a pointer-to-subprogram coming from a dispatch table,
      	return the null descriptor.
      	<N_Unchecked_Type_Conversion>: If the target uses descriptors for
      	vtables, the source type is the descriptor type and the target type
      	is a pointer type, first build the pointer.
      	* utils.c (init_gigi_decls): If the target uses descriptors for vtables
      	build the descriptor type and the null descriptor.
      
      From-SVN: r134101
      581edf92
    • Jan Hubicka's avatar
      function.c (free_after_compilation): Clear out regno_reg_rtx pointer. · 57b9e367
      Jan Hubicka authored
      	* function.c (free_after_compilation): Clear out regno_reg_rtx
      	pointer.
      
      From-SVN: r134097
      57b9e367
    • Peter Bergner's avatar
      Revert · a95c8615
      Peter Bergner authored
      	2008-04-07  Peter Bergner  <bergner@vnet.ibm.com>
      
      	PR middle-end/PR28690
      	* rtlanal.c: (commutative_operand_precedence): Give SYMBOL_REF's the
      	same precedence as REG_POINTER and MEM_POINTER operands.
      
      From-SVN: r134095
      a95c8615
    • Eric Botcazou's avatar
      decl.c (prepend_attributes): Fix typo. · e1da2b17
      Eric Botcazou authored
      	* decl.c (prepend_attributes): Fix typo.
      	* trans.c (Pragma_to_gnu): Likewise.
      	* utils.c (gnat_genericize): Likewise.
      
      From-SVN: r134094
      e1da2b17
    • Eric Botcazou's avatar
      ada-tree.h (TYPE_PACKED_ARRAY_TYPE_P): Only set it when bit-packed. · 2b3dffa6
      Eric Botcazou authored
      
      	* ada-tree.h (TYPE_PACKED_ARRAY_TYPE_P): Only set it when bit-packed.
      	* decl.c (gnat_to_gnu_entity): Adjust for above change.
      	<E_Record_Type>: Try to get a better form of the component for
      	packing, even if it has an integral mode.
      	<E_Record_Subtype>: Likewise.
      	* trans.c (gnat_to_gnu): Do not require BLKmode for the special
      	exception suppressing the final conversion between record types.
      
      
      Co-Authored-By: default avatarRichard Kenner <kenner@adacore.com>
      
      From-SVN: r134093
      2b3dffa6
    • Eric Botcazou's avatar
      decl.c (gnat_to_gnu_entity): If -gnatd.a and not optimizing alignment for space... · ba3f46d0
      Eric Botcazou authored
      	* decl.c (gnat_to_gnu_entity) <object>: If -gnatd.a and not optimizing
      	alignment for space, promote the alignment of non-scalar variables with
      	no size and alignment.
      	* gigi.h (gnat_types_compatible_p): Declare.
      	* misc.c (LANG_HOOKS_TYPES_COMPATIBLE_P): Set to above predicate.
      	* trans.c (gnat_to_gnu): Revert revision 129339 change.  Minor cleanup.
      	* utils.c (gnat_types_compatible_p) : New predicate.
      	(convert): Use it throughout to test for cases where a mere view
      	conversion is sufficient.
      	* utils2.c (build_binary_op): Minor tweaks.
      	(build_unary_op): Likewise.
      
      From-SVN: r134092
      ba3f46d0
    • Eric Botcazou's avatar
      decl.c (adjust_packed): Expand comment. · 373140ef
      Eric Botcazou authored
      	* decl.c (adjust_packed): Expand comment.
      
      From-SVN: r134091
      373140ef
    • Richard Guenther's avatar
      re PR tree-optimization/35834 (building libiberty fails in build2_stat for... · 903b3003
      Richard Guenther authored
      re PR tree-optimization/35834 (building libiberty fails in build2_stat for -mcpu=m32c as of r133403)
      
      2008-04-08  Richard Guenther  <rguenther@suse.de>
      
      	PR middle-end/35834
      	* tree-ssa-address.c (create_mem_ref): Use POINTER_PLUS_EXPR
      	for adding index to base.
      
      From-SVN: r134090
      903b3003
    • Kai Tietz's avatar
      Enable trampoline code for nx-protected stack Windows. · 0b03b302
      Kai Tietz authored
      	* config/i386/mingw32.h (ENABLE_EXECUTE_STACK): New.
      	(MINGW_ENABLE_EXECUTE_STACK): New.
      	(IN_LIBGCC2): For libgcc include windows.h file for
      	function declarations.
      
      From-SVN: r134089
      0b03b302
    • Hans-Peter Nilsson's avatar
      cris.c (cris_address_cost): For a PLUS, swap tem1 and tem2 if tem1 is not a REG or MULT. · 582be0a1
      Hans-Peter Nilsson authored
      	* config/cris/cris.c (cris_address_cost): For a PLUS, swap tem1
      	and tem2 if tem1 is not a REG or MULT.
      
      From-SVN: r134088
      582be0a1
    • Jan Hubicka's avatar
      function.h (incomming_args): Break out of struct function. · 38173d38
      Jan Hubicka authored
      	* function.h (incomming_args): Break out of struct function.
      	(function_subsections): Break out of struct function.
      	(rtl_data): Add args, subsections fields. Break out outgoing_args_size,
      	return_rtx and hard_reg_initial_vals from struct function.
      	Kill inl_max_label_num.
      	(current_function_pops_args, current_function_args_info,
      	current_function_args_size, current_function_args_size,
      	current_function_pretend_args_size,
      	current_function_outgoing_args_size,
      	current_function_internal_arg_pointer, current_function_return_rtx):
      	Kill compatibility accestor macros.
      	* builtins.c (expand_builtin_apply_args_1): Update.
      	(expand_builtin_next_arg): Update.
      	* df-scan.c (df_get_call_refs): Update.
      	* dbxout.c (dbxout_function_end): Update.
      	* dwarf2out.c (dwarf2out_switch_text_section): Update.
      	(output_line_info): Update.
      	(secname_for_decl): Update.
      	(dwarf2out_var_location): Update.
      	* function.c (free_after_compilation): Update.
      	(assign_parm_find_stack_rtl): Update.
      	(assign_parms): Update.
      	(expand_dummy_function_end): Update.
      	(expand_function_end): Update.
      	* calls.c (mem_overlaps_already_clobbered_arg_p): Update.
      	(expand_call): Update.
      	(emit_library_call_value_1): Update.
      	(store_one_arg): Update.
      	* varasm.c (initialize_cold_section_name): Update.
      	(unlikely_text_section): Update.
      	(unlikely_text_section_p): Update.
      	(assemble_start_function): Update.
      	(assemble_end_function): Update.
      	(default_section_type_flags): Update.
      	(switch_to_section): Update.
      	* integrate.c (set_decl_abstract_flags): Update.
      	(get_hard_reg_initial_val): Update.
      	(has_hard_reg_initial_val): Update.
      	(allocate_initial_values): Update.
      	* resource.c (init_resource_info): Update.
      	* config/alpha/alpha.c (NUM_ARGS): Update.
      	(direct_return): Update.
      	(alpha_va_start): Update.
      	(alpha_sa_size): Update.
      	(alpha_initial_elimination_offset): Update.
      	(alpha_expand_prologue): Update.
      	(alpha_start_function): Update.
      	(alpha_expand_epilogue): Update.
      	(unicosmk_initial_elimination_offset):
      	* config/alpha/alpha.md (call expander): Update.
      	* config/s390/s390.c (s390_register_info): Update.
      	(s390_register_info): Update.
      	(s390_frame_info): Update.
      	(s390_initial_elimination_offset): Update.
      	(s390_build_builtin_va_list): Update.
      	(s390_va_start): Update.
      	* config/spu/spu.c (direct_return): Update.
      	(spu_expand_prologue): Update.
      	(spu_initial_elimination_offset): Update.
      	(spu_build_builtin_va_list): Update.
      	(spu_va_start): Update.
      	* config/sparc/sparc.c (sparc_init_modes): Update.
      	(sparc_compute_frame_size): Update.
      	(function_value): Update.
      	* config/m32r/m32r.c (m32r_compute_frame_size): Update.
      	* config/i386/i386.md (return expander): Update.
      	* config/i386/i386.c (ix86_va_start): Update.
      	(ix86_can_use_return_insn_p): Update.
      	(ix86_compute_frame_layout): Update.
      	(ix86_expand_epilogue): Update.
      	* config/sh/sh.c (output_stack_adjust): Update.
      	(calc_live_regs): Update.
      	(sh_expand_prologue): Update.
      	(sh_builtin_saveregs): Update.
      	(sh_va_start): Update.
      	(initial_elimination_offset): Update.
      	(sh_allocate_initial_value): Update.
      	(sh_function_ok_for_sibcall): Update.
      	(sh_get_pr_initial_val): Update.
      	* config/sh/sh.md (return expander): Update.
      	* config/avr/avr.c (frame_pointer_required_p): UPdate.
      	* config/crx/crx.c (crx_compute_frame): UPdate.
      	(crx_initial_elimination_offset): UPdate.
      	* config/xtensa/xtensa.c (compute_frame_size): Update
      	(xtensa_builtin_saveregs): Update.
      	(xtensa_va_start): Update.
      	(order_regs_for_local_alloc): Update.
      	* config/stormy16/stormy16.c (xstormy16_compute_stack_layout): Update.
      	(xstormy16_expand_builtin_va_start): Update.
      	* config/fr30/fr30.c (fr30_compute_frame_size): Update.
      	* config/m68hc11/m68hc11.md (return expanders): Update.
      	* config/m68hc11/m68hc11.c (expand_prologue): Update.
      	(expand_epilogue): Update.
      	* config/cris/cris.c (cris_initial_frame_pointer_offset): Update.
      	(cris_simple_epilogue): Update.
      	(cris_expand_prologue): Update.
      	(cris_expand_epilogue): Update.
      	* config/iq2000/iq2000.c (iq2000_va_start): Update.
      	(compute_frame_size): Update.
      	* config/mt/mt.c (mt_compute_frame_size): Update.
      	* config/mn10300/mn10300.c (expand_prologue): Update.
      	(expand_epilogue): Update.
      	(initial_offset): Update.
      	(mn10300_builtin_saveregs):
      	* config/mn10300/mn10300.md (return expander): Update.
      	* config/ia64/ia64.c (ia64_compute_frame_size): Update.
      	(ia64_initial_elimination_offset): Update.
      	(ia64_initial_elimination_offset): Update.
      	(ia64_expand_prologue): Update.
      	* config/m68k/m68k.md (return expander): Update.
      	* config/rs6000/rs6000.c (rs6000_va_start): Update.
      	(rs6000_stack_info): Update.
      	* config/mcore/mcore.c (layout_mcore_frame): Update.
      	(mcore_expand_prolog): Update.
      	* config/arc/arc.c (arc_compute_frame_size): Update.
      	* config/score/score3.c (score3_compute_frame_size): Update.
      	* config/score/score7.c (score7_compute_frame_size): Update.
      	* config/arm/arm.c (use_return_insn): Update.
      	(thumb_find_work_register): Update.
      	(arm_compute_save_reg_mask): Update.
      	(arm_output_function_prologue): Update.
      	(arm_output_epilogue): Update.
      	(arm_size_return_regs): Update.
      	(arm_get_frame_offsets): Update.
      	(arm_expand_prologue): Update.
      	(thumb_exit): Update.
      	(thumb_unexpanded_epilogue): Update.
      	(thumb1_output_function_prologue): Update.
      	* config/pa/pa.md (return expander): Update.
      	* config/pa/pa.c (compute_frame_size): Update.
      	(hppa_builtin_saveregs): Update.
      	* config/mips/mips.c (mips_va_start): Update.
      	(mips16_build_function_stub): Update.
      	(mips_compute_frame_info): Update.
      	(mips_restore_gp): Update.
      	(mips_output_function_prologue): Update.
      	(mips_expand_prologue): Update.
      	* config/v850/v850.c (compute_frame_size): Update.
      	(expand_prologue): * config/mmix/mmix.c (along): update.
      	(mmix_initial_elimination_offset): update.
      	(mmix_reorg): update.
      	(mmix_use_simple_return): update.
      	(mmix_expand_prologue): update.
      	(mmix_expand_epilogue): Update.
      	* config/bfin/bfin.c (bfin_initial_elimination_offset): Update.
      	(emit_link_insn): Update.
      
      From-SVN: r134087
      38173d38
    • Arnaud Charlet's avatar
      parent_ltd_with-child_full_view.adb: New test. · 02ba6f3c
      Arnaud Charlet authored
      	* gnat.dg/parent_ltd_with-child_full_view.adb: New test.
      	* gnat.dg/rt1.adb: New test.
      	* gnat.dg/test_time_stamp.adb: New test.
      	* gnat.dg/specs/warn_star.ads: New test.
      	* gnat.dg/specs/aggr1.ads: New test.
      
      From-SVN: r134086
      02ba6f3c
    • Arnaud Charlet's avatar
      parent_ltd_with-child_full_view.adb: New test. · 1e00de1f
      Arnaud Charlet authored
      	* gnat.dg/parent_ltd_with-child_full_view.adb: New test.
      	* gnat.dg/rt1.adb: New test.
      	* gnat.dg/test_time_stamp.adb: New test.
      	* gnat.dg/specs/warn_star.ads: New test.
      	* gnat.dg/specs/aggr1.ads: New test.
      
      From-SVN: r134085
      1e00de1f
    • Arnaud Charlet's avatar
      Resync. · ea081ad7
      Arnaud Charlet authored
      From-SVN: r134084
      ea081ad7
    • Arnaud Charlet's avatar
      Removed. · e957f438
      Arnaud Charlet authored
      From-SVN: r134083
      e957f438
    • Arnaud Charlet's avatar
      Update comments. · db17411e
      Arnaud Charlet authored
      Minor reformatting.
      
      From-SVN: r134082
      db17411e
    • Arnaud Charlet's avatar
      New file. · b18acc1b
      Arnaud Charlet authored
      From-SVN: r134081
      b18acc1b
    • Arnaud Charlet's avatar
      Change name In_Default_Expression => In_Spec_Expression Change name... · c4b8d145
      Arnaud Charlet authored
      Change name In_Default_Expression      => In_Spec_Expression
      Change name Analyze_Per_Use_Expression => Preanalyze_Spec_Expression
      Change name Pre_Analyze_And_Resolve    => Preanalyze_And_Resolve
      
      From-SVN: r134080
      c4b8d145
    • Arnaud Charlet's avatar
      (Task_Address): New subtype of System.Address · eb0a4598
      Arnaud Charlet authored
      (Task_Address): New subtype of System.Address
      (Task_Address_Size): New constant size of System.Address
      (Alternate_Stack_Size): New constant.
      
      From-SVN: r134079
      eb0a4598
Loading