Skip to content
Snippets Groups Projects
  1. Mar 26, 2013
    • Eric Botcazou's avatar
      * gcc.c-torture/execute/20011008-3.c: Cap VLEN with STACK_SIZE too. · 21c80225
      Eric Botcazou authored
      From-SVN: r197125
      21c80225
    • Janne Blomqvist's avatar
      PR 25708 Use a temporary buffer when parsing module files. · 092e08c0
      Janne Blomqvist authored
      2013-03-27  Janne Blomqvist  <jb@gcc.gnu.org>
      
      	PR fortran/25708
              * module.c (module_locus): Use long for position.
              (module_content): New variable.
              (module_pos): Likewise.
              (prev_character): Remove.
              (bad_module): Free data instead of closing mod file.
              (set_module_locus): Use module_pos.
              (get_module_locus): Likewise.
              (module_char): use buffer rather than stdio file.
              (module_unget_char): Likewise.
              (read_module_to_tmpbuf): New function.
              (gfc_use_module): Call read_module_to_tmpbuf.
      
      From-SVN: r197124
      092e08c0
    • Eric Botcazou's avatar
      * doc/invoke.texi (SPARC options): Remove -mlittle-endian. · 4fc7b145
      Eric Botcazou authored
      From-SVN: r197120
      4fc7b145
    • Gabriel Dos Reis's avatar
      cp-gimplify.c (cp_genericize_r): Use VAR_OR_FUNCTION_DECL_P. · cb6da767
      Gabriel Dos Reis authored
      	* cp-gimplify.c (cp_genericize_r): Use VAR_OR_FUNCTION_DECL_P.
      	* decl.c (duplicate_decls): Likewise.
      	(cp_finish_decl): Likewise.
      	(check_class_member_definition_namespace): Likewise.
      	* decl2.c (grokfield): Likewise.
      	(decl_needed_p): Likewise.
      	(import_export_decl): Likewise.
      	(mark_used): Likewise.
      	* name-lookup.c (pushdecl_maybe_friend_1): Likewise.
      	* pt.c (push_access_scope): Likewise.
      	(instantiate_decl): Likewise.
      	* ptree.c (cxx_print_decl): Likewise.
      	* repo.c (repo_emit_p): Likewise.
      	* semantics.c (note_decl_for_pch): Likewise.
      	* tree.c (decl_linkage): Likewise.
      
      From-SVN: r197119
      cb6da767
    • Joseph Myers's avatar
      * de.po, sv.po: Update. · 7e10b756
      Joseph Myers authored
      From-SVN: r197117
      7e10b756
    • Paolo Carlini's avatar
      re PR c++/55951 (ICE in check_array_designated_initializer, at cp/decl.c:4785) · 515e4d1d
      Paolo Carlini authored
      /cp
      2013-03-26  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR c++/55951
      	* decl.c (check_array_designated_initializer): Handle CONST_DECL
      	as ce->index.
      
      /testsuite
      2013-03-26  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR c++/55951
      	* g++.dg/ext/desig5.C: New.
      
      From-SVN: r197116
      515e4d1d
    • Roland McGrath's avatar
      arm.c (arm_print_operand: case 'w'): Use fputs rather than fprintf with a... · 6f33817e
      Roland McGrath authored
      arm.c (arm_print_operand: case 'w'): Use fputs rather than fprintf with a non-constant, non-format string.
      
      	* config/arm/arm.c (arm_print_operand: case 'w'): Use fputs rather
      	than fprintf with a non-constant, non-format string.
      
      From-SVN: r197115
      6f33817e
    • Uros Bizjak's avatar
      i386.md (*cmpqi_ext_1): Merge with *cmpqi_ext_1_rex64 using nox64 isa attribute. · 93a4145b
      Uros Bizjak authored
      	* config/i386/i386.md (*cmpqi_ext_1): Merge with *cmpqi_ext_1_rex64
      	using nox64 isa attribute.  Use nonimmediate_x86nomem_operand as
      	operand 0 predicate.
      	(*cmpqi_ext_3): Merge with *cmpqi_ext_3_rex64 using nox64 isa
      	attribute.  Use general_x64nomem_operand as operand 1 predicate.
      	(*movqi_extv_1): Merge with *movqi_extv_1_rex64 using nox64 isa
      	attribute.  Use nonimmediate_x64nomem_operand as operand 0 predicate.
      	(*movqi_extzv_2): Merge with *movqi_extzv_2_rex64 using nox64 isa
      	attribute.  Use nonimmediate_x64nomem_operand as operand 0 predicate.
      	(mov<mode>_insv_1): Remove expander.  Merge insn with
      	movsi_insv_1 using SWI48 mode iterator and nox64 isa attribute.
      	Use general_x64nomem_operand as operand 1 predicate.
      	(addqi_ext_1): Merge with *addqi_ext_1_rex64 using nox64 isa attribute.
      	(*testqi_ext_1): Merge with *testqi_ext_1_rex64 using nox64 isa
      	attribute.  Use nonimmediate_x64nomem_operand as operand 1 predicate.
      	(*andqi_ext_1): Merge with *andqi_ext_1_rex64 using nox64 isa
      	attribute.  Use nonimmediate_x64nomem_operand as operand 2 predicate.
      	(*<code>qi_ext_1): Merge with *<code>qi_ext_1_rex64 using nox64 isa
      	attribute.  Use nonimmediate_x64nomem_operand as operand 1 predicate.
      	(*xorqi_cc_ext_1): Merge with *xorqi_cc_ext_1_rex64 using nox64
      	isa attribute.  Use general_x64nomem_operand as operand 2 predicate.
      	* config/i386/predicates.md (nonimmediate_x64nomem_operand): New.
      	(general_x64nomem_operand): Ditto.
      
      From-SVN: r197114
      93a4145b
    • Joel Sherrill's avatar
      Fix date. · c6a9ed5a
      Joel Sherrill authored
      From-SVN: r197112
      c6a9ed5a
    • Sebastian Huber's avatar
      rtems.opt: Add -pthread option. · df599020
      Sebastian Huber authored
      2013-01-29  Sebastian Huber  <sebastian.huber@embedded-brains.de>
      
      	* config/rtems.opt: Add -pthread option.
      
      From-SVN: r197111
      df599020
    • Richard Biener's avatar
      alias.c (find_base_term): Avoid redundant and not used recursion. · 31b0a960
      Richard Biener authored
      2013-03-26  Richard Biener  <rguenther@suse.de>
      
      	* alias.c (find_base_term): Avoid redundant and not used
      	recursion.
      	(base_alias_check): Get the initial base term from the
      	caller.
      	(true_dependence_1): Compute and pass base terms to base_alias_check.
      	(write_dependence_p): Likewise.
      	(may_alias_p): Likewise.
      
      From-SVN: r197110
      31b0a960
    • Tobias Burnus's avatar
      re PR fortran/56649 (ICE gfc_conv_structure with MERGE) · 03580130
      Tobias Burnus authored
      2013-03-26  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/56649
              * simplify.c (gfc_simplify_merge): Simplify more.
      
      2013-03-26  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/56649
              * gfortran.dg/merge_init_expr_2.f90: New.
              * gfortran.dg/merge_char_1.f90: Modify test to
              stay a run-time test.
              * gfortran.dg/merge_char_3.f90: Ditto.
      
      From-SVN: r197109
      03580130
    • Sofiane Naci's avatar
      aarch64.c (aarch64_classify_address): Support PC-relative load in SI modes and above only. · 79517551
      Sofiane Naci authored
      	* config/aarch64/aarch64.c (aarch64_classify_address): Support
      	PC-relative load in SI modes and above only.
      
      From-SVN: r197107
      79517551
    • Xinyu Qi's avatar
      For Xinyu Qi - Fix define_constants for WCGR. · a76213b9
      Xinyu Qi authored
      From-SVN: r197104
      a76213b9
    • Uros Bizjak's avatar
      i386.md (*movdfcc_1): Merge with *movdfcc_1_rex64. · 37ff9355
      Uros Bizjak authored
      	* config/i386/i386.md (*movdfcc_1): Merge with *movdfcc_1_rex64.
      	Use x64 and nox64 isa attributes.
      
      From-SVN: r197101
      37ff9355
    • Paolo Carlini's avatar
      decl.c (grokfndecl): Handle separately <inline> and <constexpr> error messages. · 5cf2a084
      Paolo Carlini authored
      /cp
      2013-03-26  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* decl.c (grokfndecl): Handle separately <inline> and <constexpr>
      	error messages.
      
      	* decl.c (grokdeclarator): Declare typedef_p and use it everywhere.
      
      /testsuite
      2013-03-26  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	* g++.dg/cpp0x/constexpr-friend-2.C: New.
      	* g++.dg/cpp0x/constexpr-main.C: Likewise.
      
      From-SVN: r197097
      5cf2a084
    • Richard Biener's avatar
      emit-rtl.c (set_mem_attributes_minus_bitpos): Remove alignment computations... · 30b0317c
      Richard Biener authored
      emit-rtl.c (set_mem_attributes_minus_bitpos): Remove alignment computations and rely on get_object_alignment_1 for the...
      
      2013-03-26  Richard Biener  <rguenther@suse.de>
      
      	* emit-rtl.c (set_mem_attributes_minus_bitpos): Remove
      	alignment computations and rely on get_object_alignment_1
      	for the !TYPE_P case.
      	Commonize DECL/COMPONENT_REF handling in the ARRAY_REF path.
      
      From-SVN: r197095
      30b0317c
    • Walter Lee's avatar
      tilegx.h (PROFILE_BEFORE_PROLOGUE): Define. · cbcdb140
      Walter Lee authored
      	* config/tilegx/tilegx.h (PROFILE_BEFORE_PROLOGUE): Define.
      	* config/tilegx/tilepro.h (PROFILE_BEFORE_PROLOGUE): Define.
      
      From-SVN: r197084
      cbcdb140
    • Walter Lee's avatar
      t-crtstuff: Add -fno-asynchronous-unwind-tables -mcmodel=large to CRTSTUFF_T_CFLAGS_S variable. · a6406324
      Walter Lee authored
      	* config/tilegx/t-crtstuff: Add -fno-asynchronous-unwind-tables
      	-mcmodel=large to CRTSTUFF_T_CFLAGS_S variable.
      
      From-SVN: r197083
      a6406324
    • Jeff Law's avatar
      tree-ssa-dom.c (record_equivalences_from_incoming_edge): Add missing check for... · dd884525
      Jeff Law authored
      tree-ssa-dom.c (record_equivalences_from_incoming_edge): Add missing check for INTEGRAL_TYPE_P that was missing due to checking in wrong...
      
              * tree-ssa-dom.c (record_equivalences_from_incoming_edge): Add missing
              check for INTEGRAL_TYPE_P that was missing due to checking in wrong
              version of prior patch.
      
      From-SVN: r197082
      dd884525
    • Walter Lee's avatar
      tilegx-builtins.h (enum tilegx_builtin): Add TILEGX_INSN_SHUFFLEBYTES1. · 0051d3ec
      Walter Lee authored
      	* config/tilegx/tilegx-builtins.h (enum tilegx_builtin): Add
      	TILEGX_INSN_SHUFFLEBYTES1.
      	* config/tilegx/tilegx.c (tilegx_builtin_info): Add entry for
      	shufflebytes1.
      	(tilegx_builtins): Ditto.
      	* config/tilegx/tilegx.md (insn_shufflebytes1): New pattern.
      
      From-SVN: r197080
      0051d3ec
    • Walter Lee's avatar
      tilegx.md (floatsisf2): New pattern. · 065a3605
      Walter Lee authored
      2013-03-25  Walter Lee  <walt@tilera.com>
      
      	* config/tilegx/tilegx.md (floatsisf2): New pattern.
              (floatunssisf2): New pattern.
              (floatsidf2): New pattern.
              (floatunssidf2): New pattern.
      
      From-SVN: r197079
      065a3605
    • GCC Administrator's avatar
      Daily bump. · 9b2732d6
      GCC Administrator authored
      From-SVN: r197078
      9b2732d6
  2. Mar 25, 2013
    • Walter Lee's avatar
      tilegx.c (expand_set_cint64_one_inst): Inline tests for constraint J, K, N, P. · 5b2a3c82
      Walter Lee authored
             * config/tilegx/tilegx.c (expand_set_cint64_one_inst): Inline
             tests for constraint J, K, N, P.
      
      From-SVN: r197074
      5b2a3c82
    • Walter Lee's avatar
      Switch eh data to always use pc relative/indirect encoding, to avoid · 192ea533
      Walter Lee authored
      relocations of unaligned words.
      
      From-SVN: r197073
      192ea533
    • Steve Ellcey's avatar
      mmips-cpus.def (74kc, [...]): Add PTF_AVOID_IMADD. · 855e0d0b
      Steve Ellcey authored
      2013-03-25  Steve Ellcey  <sellcey@mips.com>
      
      	* config/mips/mmips-cpus.def (74kc, 74kf2_1, 74kf, 74kf, 74kf1_1,
      	74kfx, 74kx, 74kf3_2): Add PTF_AVOID_IMADD.
      	* config/mips/mips.c (mips_option_override): Set IMADD default.
      	* config/mips/mips.h (PTF_AVOID_IMADD): New.
      	(ISA_HAS_MADD_MSUB): Remove MIPS16 check.
      	(GENERATE_MADD_MSUB): Remove TUNE_74K check, add MIPS16 check.
      	* config/mips/mips.md (mimadd): New flag for integer madd/msub.
      	* doc/invoke.texi (-mimadd/-mno-imadd): New.
      
      From-SVN: r197072
      855e0d0b
    • Jason Merrill's avatar
      re PR c++/56699 (Failed for sizeof (non-static member) in lambda expression) · f02296dd
      Jason Merrill authored
      	PR c++/56699
      	* semantics.c (maybe_resolve_dummy): Make sure that the enclosing
      	class is derived from the type of the object.
      
      From-SVN: r197069
      f02296dd
    • Jason Merrill's avatar
      re PR c++/56692 ([C++11] Segmentation fault when calling static/non-static... · b85db96a
      Jason Merrill authored
      re PR c++/56692 ([C++11] Segmentation fault when calling static/non-static overloaded function from lambda)
      
      	PR c++/56692
      	* g++.dg/cpp0x/lambda/lambda-this15.C: New.
      
      From-SVN: r197068
      b85db96a
    • Jason Merrill's avatar
      re PR c++/52014 ([c++0x] Segfault When `decltype` Used in Nested Lambda... · 963afe1b
      Jason Merrill authored
      re PR c++/52014 ([c++0x] Segfault When `decltype` Used in Nested Lambda Function Defined in Class Member Function)
      
      	PR c++/52014
      	* semantics.c (lambda_expr_this_capture): Don't capture 'this' in
      	unevaluated context.
      
      From-SVN: r197063
      963afe1b
    • Paolo Carlini's avatar
      re PR c++/56722 (C++11: syntax error in for loop ends in SEGV) · bbce8a8a
      Paolo Carlini authored
      /cp
      2013-03-25  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR c++/56722
      	* decl.c (cp_finish_decl): Check DECL_LANG_SPECIFIC before
      	DECL_TEMPLATE_INSTANTIATION.
      
      /testsuite
      2013-03-25  Paolo Carlini  <paolo.carlini@oracle.com>
      
      	PR c++/56722
      	* g++.dg/cpp0x/range-for23.C: New.
      
      From-SVN: r197062
      bbce8a8a
    • Tilo Schwarz's avatar
      re PR fortran/52512 (Cannot match namelist object name) · 6f6fafc9
      Tilo Schwarz authored
      2013-03-25  Tilo Schwarz  <tilo@tilo-schwarz.de>
      
              PR libfortran/52512
              * io/list_read.c (nml_parse_qualifier): To check for a derived type
              don't use the namelist head element type but the current element type.
              (nml_get_obj_data): Add current namelist element type to
              nml_parse_qualifier call.
      
      2013-03-25  Tilo Schwarz  <tilo@tilo-schwarz.de>
      
              PR libfortran/52512
              * gfortran.dg/namelist_79.f90: New.
      
      From-SVN: r197061
      6f6fafc9
    • Jeff Law's avatar
      tree-ssa-dom.c (record_equivalences_from_incoming_edge): Rework slightly to... · 39e45653
      Jeff Law authored
      tree-ssa-dom.c (record_equivalences_from_incoming_edge): Rework slightly to avoid creating and folding useless trees.
      
              * tree-ssa-dom.c (record_equivalences_from_incoming_edge): Rework
      	slightly to avoid creating and folding useless trees.  Simplify
              slightly by restricting to INTEGER_CSTs and using int_fits_type_p.
      
      From-SVN: r197060
      39e45653
    • Ian Lance Taylor's avatar
      alloc.c: #include <sys/types.h>. · 85d8c21e
      Ian Lance Taylor authored
      	* alloc.c: #include <sys/types.h>.
      	* mmap.c: Likewise.
      
      From-SVN: r197057
      85d8c21e
    • Uros Bizjak's avatar
      i386.md (*zero_extendsidi2): Merge with *zero_extendsidi2_rex64. · 7482c470
      Uros Bizjak authored
      	* config/i386/i386.md (*zero_extendsidi2): Merge with
      	*zero_extendsidi2_rex64.  Use x64 and nox64 isa attributes.
      	* config/i386/predicates.md (x86_64_zext_operand): Rename from
      	x86_64_zext_general_operand.  Use nonimmediate_operand on 32bit
      	targets.  Clarify comment.
      
      From-SVN: r197056
      7482c470
    • Martin Jambor's avatar
      ipa-prop.c (ipa_write_jump_function): Stream simple and aritmetic pass-through... · 4a53743e
      Martin Jambor authored
      ipa-prop.c (ipa_write_jump_function): Stream simple and aritmetic pass-through jump functions differently.
      
      2013-03-25  Martin Jambor  <mjambor@suse.cz>
      
      	* ipa-prop.c (ipa_write_jump_function): Stream simple and aritmetic
      	pass-through jump functions differently.
      	(ipa_read_jump_function): Likewise.  Also use setter functions to set
      	up jump functions.
      
      From-SVN: r197055
      4a53743e
    • Martin Jambor's avatar
      ipa-cp.c (ipa_get_indirect_edge_target): Renamed to ipa_get_indirect_edge_target_1... · 162712de
      Martin Jambor authored
      2013-03-25  Martin Jambor  <mjambor@suse.cz>
      
      	* ipa-cp.c (ipa_get_indirect_edge_target): Renamed to
      	ipa_get_indirect_edge_target_1, added parameter agg_reps and ability to
      	process it.
      	(ipa_get_indirect_edge_target): New function.
      	(devirtualization_time_bonus): New parameter known_aggs, pass it to
      	ipa_get_indirect_edge_target.  Update all callers.
      	(ipcp_discover_new_direct_edges): New parameter aggvals.  Pass it to
      	ipa_get_indirect_edge_target_1 instead of calling
      	ipa_get_indirect_edge_target.
      	(create_specialized_node): Pass aggvlas to
      	ipcp_discover_new_direct_edges.
      
      testsuite/
      	* gcc.dg/ipa/ipcp-agg-9.c: New test.
      
      From-SVN: r197054
      162712de
    • Tobias Burnus's avatar
      re PR fortran/38536 (ICE with C_LOC in resolve.c due to not properly going through expr->ref) · cadddfdd
      Tobias Burnus authored
      2013-03-25  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/38536
              PR fortran/38813
              PR fortran/38894
              PR fortran/39288
              PR fortran/40963
              PR fortran/45824
              PR fortran/47023
              PR fortran/47034
              PR fortran/49023
              PR fortran/50269
              PR fortran/50612
              PR fortran/52426
              PR fortran/54263
              PR fortran/55343
              PR fortran/55444
              PR fortran/55574
              PR fortran/56079
              PR fortran/56378
              * check.c (gfc_var_strlen): Properly handle 0-sized string.
              (gfc_check_c_sizeof): Use is_c_interoperable, add checks.
              (is_c_interoperable, gfc_check_c_associated, gfc_check_c_f_pointer,
              gfc_check_c_f_procpointer, gfc_check_c_funloc, gfc_check_c_loc): New
              functions.
              * expr.c (check_inquiry): Add c_sizeof, compiler_version and
              compiler_options.
              (gfc_check_pointer_assign): Refine function result check.
              gfortran.h (gfc_isym_id): Add GFC_ISYM_C_ASSOCIATED,
              GFC_ISYM_C_F_POINTER, GFC_ISYM_C_F_PROCPOINTER, GFC_ISYM_C_FUNLOC,
              GFC_ISYM_C_LOC.
              (iso_fortran_env_symbol, iso_c_binding_symbol): Handle
              NAMED_SUBROUTINE.
              (generate_isocbinding_symbol): Update prototype.
              (get_iso_c_sym): Remove.
              (gfc_isym_id_by_intmod, gfc_isym_id_by_intmod_sym): New prototypes.
              * intrinsic.c (gfc_intrinsic_subroutine_by_id): New function.
              (gfc_intrinsic_sub_interface): Use it.
              (add_functions, add_subroutines): Add missing C-binding intrinsics.
              (gfc_intrinsic_func_interface): Add special case for c_loc.
              gfc_isym_id_by_intmod, gfc_isym_id_by_intmod_sym): New functions.
              (gfc_intrinsic_func_interface, gfc_intrinsic_sub_interface): Use them.
              * intrinsic.h (gfc_check_c_associated, gfc_check_c_f_pointer,
              gfc_check_c_f_procpointer, gfc_check_c_funloc, gfc_check_c_loc,
              gfc_resolve_c_loc, gfc_resolve_c_funloc): New prototypes.
              * iresolve.c (gfc_resolve_c_loc, gfc_resolve_c_funloc): New
              functions.
              * iso-c-binding.def: Split PROCEDURE into NAMED_SUBROUTINE and
              NAMED_FUNCTION.
              * iso-fortran-env.def: Add NAMED_SUBROUTINE for completeness.
              * module.c (create_intrinsic_function): Support subroutines and
              derived-type results.
              (use_iso_fortran_env_module): Update calls.
              (import_iso_c_binding_module): Ditto; update calls to
              generate_isocbinding_symbol.
              * resolve.c (find_arglists): Skip for intrinsic symbols.
              (gfc_resolve_intrinsic): Find intrinsic subs via id.
              (is_scalar_expr_ptr, gfc_iso_c_func_interface,
              set_name_and_label, gfc_iso_c_sub_interface): Remove.
              (resolve_function, resolve_specific_s0): Remove calls to those.
              (resolve_structure_cons): Fix handling.
              * symbol.c (gen_special_c_interop_ptr): Update c_ptr/c_funptr
              generation.
              (gen_cptr_param, gen_fptr_param, gen_shape_param,
              build_formal_args, get_iso_c_sym): Remove.
              (std_for_isocbinding_symbol): Handle NAMED_SUBROUTINE.
              (generate_isocbinding_symbol): Support hidden symbols and
              using c_ptr/c_funptr symtrees for nullptr defs.
              * target-memory.c (gfc_target_encode_expr): Fix handling
              of c_ptr/c_funptr.
              * trans-expr.c (conv_isocbinding_procedure): Remove.
              (gfc_conv_procedure_call): Remove call to it.
              (gfc_trans_subcomponent_assign, gfc_conv_expr): Update handling
              of c_ptr/c_funptr.
              * trans-intrinsic.c (conv_isocbinding_function,
              conv_isocbinding_subroutine): New.
              (gfc_conv_intrinsic_function, gfc_conv_intrinsic_subroutine):
              Call them.
              * trans-io.c (transfer_expr): Fix handling of c_ptr/c_funptr.
              * trans-types.c (gfc_typenode_for_spec,
              gfc_get_derived_type): Ditto.
              (gfc_init_c_interop_kinds): Handle NAMED_SUBROUTINE.
      
      2013-03-25  Tobias Burnus  <burnus@net-b.de>
      
              PR fortran/38536
              PR fortran/38813
              PR fortran/38894
              PR fortran/39288
              PR fortran/40963
              PR fortran/45824
              PR fortran/47023
              PR fortran/47034
              PR fortran/49023
              PR fortran/50269
              PR fortran/50612
              PR fortran/52426
              PR fortran/54263
              PR fortran/55343
              PR fortran/55444
              PR fortran/55574
              PR fortran/56079
              PR fortran/56378
              * gfortran.dg/c_assoc_2.f03: Update dg-error wording.
              * gfortran.dg/c_f_pointer_shape_test.f90: Ditto.
              * gfortran.dg/c_f_pointer_shape_tests_3.f03: Ditto.
              * gfortran.dg/c_f_pointer_tests_5.f90: Ditto.
              * gfortran.dg/c_funloc_tests_2.f03: Ditto.
              * gfortran.dg/c_funloc_tests_5.f03: Ditto.
              * gfortran.dg/c_funloc_tests_6.f90: Ditto.
              * gfortran.dg/c_loc_tests_10.f03: Add -std=f2008.
              * gfortran.dg/c_loc_tests_11.f03: Ditto, update dg-error.
              * gfortran.dg/c_loc_tests_16.f90: Ditto.
              * gfortran.dg/c_loc_tests_4.f03: Ditto.
              * gfortran.dg/c_loc_tests_15.f90: Update dg-error wording.
              * gfortran.dg/c_loc_tests_3.f03: Valid since F2003 TC5.
              * gfortran.dg/c_loc_tests_8.f03: Ditto.
              * gfortran.dg/c_ptr_tests_14.f90: Update scan-tree-dump-times.
              * gfortran.dg/c_ptr_tests_15.f90: Ditto.
              * gfortran.dg/c_sizeof_1.f90: Fix invalid code.
              * gfortran.dg/iso_c_binding_init_expr.f03: Update dg-error wording.
              * gfortran.dg/pr32601_1.f03: Ditto.
              * gfortran.dg/storage_size_2.f08: Remove dg-error.
              * gfortran.dg/blockdata_7.f90: New.
              * gfortran.dg/c_assoc_4.f90: New.
              * gfortran.dg/c_f_pointer_tests_6.f90: New.
              * gfortran.dg/c_f_pointer_tests_7.f90: New.
              * gfortran.dg/c_funloc_tests_8.f90: New.
              * gfortran.dg/c_loc_test_17.f90: New.
              * gfortran.dg/c_loc_test_18.f90: New.
              * gfortran.dg/c_loc_test_19.f90: New.
              * gfortran.dg/c_loc_test_20.f90: New.
              * gfortran.dg/c_sizeof_5.f90: New.
              * gfortran.dg/iso_c_binding_rename_3.f90: New.
              * gfortran.dg/transfer_resolve_2.f90: New.
              * gfortran.dg/transfer_resolve_3.f90: New.
              * gfortran.dg/transfer_resolve_4.f90: New.
              * gfortran.dg/pr32601.f03: Update dg-error.
              * gfortran.dg/c_ptr_tests_13.f03: Update dg-error.
              * gfortran.dg/c_ptr_tests_9.f03: Fix test case.
      
      From-SVN: r197053
      cadddfdd
    • Kyrylo Tkachov's avatar
      arm.md (f_sels, f_seld): New types. · a5a4c20a
      Kyrylo Tkachov authored
      gcc/
      2013-03-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
      
      	* config/arm/arm.md (f_sels, f_seld): New types.
      	(*cmov<mode>): New pattern.
      	* config/arm/predicates.md (arm_vsel_comparison_operator): New
      	predicate.
      
      gcc/testsuite/
      2013-03-25  Kyrylo Tkachov  <kyrylo.tkachov@arm.com>
      
      	* gcc.target/arm/vseleqdf.c: New test.
      	* gcc.target/arm/vseleqsf.c: Likewise.
      	* gcc.target/arm/vselgedf.c: Likewise.
      	* gcc.target/arm/vselgesf.c: Likewise.
      	* gcc.target/arm/vselgtdf.c: Likewise.
      	* gcc.target/arm/vselgtsf.c: Likewise.
      	* gcc.target/arm/vselledf.c: Likewise.
      	* gcc.target/arm/vsellesf.c: Likewise.
      	* gcc.target/arm/vselltdf.c: Likewise.
      	* gcc.target/arm/vselltsf.c: Likewise.
      	* gcc.target/arm/vselnedf.c: Likewise.
      	* gcc.target/arm/vselnesf.c: Likewise.
      	* gcc.target/arm/vselvcdf.c: Likewise.
      	* gcc.target/arm/vselvcsf.c: Likewise.
      	* gcc.target/arm/vselvsdf.c: Likewise.
      	* gcc.target/arm/vselvssf.c: Likewise.
      
      From-SVN: r197052
      a5a4c20a
    • Kyrylo Tkachov's avatar
      Fix ChangeLog formatting. · a5784ce6
      Kyrylo Tkachov authored
      gcc/
      Fix ChangeLog formatting.
      
      gcc/testsuite
      2013-03-25  Kyrylo Tkachov  <kyrylo.tkachov at arm.com>
      
      	* gcc.target/aarch64/atomic-comp-swap-release-acquire.c: Move test
      	body from here...
      	* gcc.target/aarch64/atomic-comp-swap-release-acquire.x: ... to here.
      	* gcc.target/aarch64/atomic-op-acq_rel.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-acq_rel.x: ... to here.
      	* gcc.target/aarch64/atomic-op-acquire.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-acquire.x: ... to here.
      	* gcc.target/aarch64/atomic-op-char.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-char.x: ... to here.
      	* gcc.target/aarch64/atomic-op-consume.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-consume.x: ... to here.
      	* gcc.target/aarch64/atomic-op-int.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-int.x: ... to here.
      	* gcc.target/aarch64/atomic-op-relaxed.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-relaxed.x: ... to here.
      	* gcc.target/aarch64/atomic-op-release.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-release.x: ... to here.
      	* gcc.target/aarch64/atomic-op-seq_cst.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-seq_cst.x: ... to here.
      	* gcc.target/aarch64/atomic-op-short.c: Move test body from here...
      	* gcc.target/aarch64/atomic-op-short.x: ... to here.
      	* gcc.target/arm/atomic-comp-swap-release-acquire.c: New test.
      	* gcc.target/arm/atomic-op-acq_rel.c: Likewise.
      	* gcc.target/arm/atomic-op-acquire.c: Likewise.
      	* gcc.target/arm/atomic-op-char.c: Likewise.
      	* gcc.target/arm/atomic-op-consume.c: Likewise.
      	* gcc.target/arm/atomic-op-int.c: Likewise.
      	* gcc.target/arm/atomic-op-relaxed.c: Likewise.
      	* gcc.target/arm/atomic-op-release.c: Likewise.
      	* gcc.target/arm/atomic-op-seq_cst.c: Likewise.
      	* gcc.target/arm/atomic-op-short.c: Likewise.
      
      From-SVN: r197051
      a5784ce6
    • Kai Tietz's avatar
      * config/i386/cygwin.S: Replace use of _WIN64 by __x86_64__. · 55446c7e
      Kai Tietz authored
      From-SVN: r197050
      55446c7e
Loading