- Oct 19, 2009
-
-
Jakub Jelinek authored
From-SVN: r152991
-
Jakub Jelinek authored
* unwind-dw2.c (execute_stack_op): Fix operand order for DW_OP_le, DW_OP_ge, DW_OP_lt and DW_OP_gt. * gcc.dg/cleanup-13.c: New test. From-SVN: r152989
-
Janus Weil authored
2009-10-19 Janus Weil <janus@gcc.gnu.org> PR fortran/41586 * parse.c (parse_derived): Correctly set 'alloc_comp' and 'pointer_comp' for CLASS variables. * trans-array.c (structure_alloc_comps): Handle deallocation and nullification of allocatable scalar components. * trans-decl.c (gfc_get_symbol_decl): Remember allocatable scalars for automatic deallocation. (gfc_trans_deferred_vars): Automatically deallocate allocatable scalars. 2009-10-19 Janus Weil <janus@gcc.gnu.org> PR fortran/41586 * gfortran.dg/auto_dealloc_1.f90: New test case. From-SVN: r152988
-
Jakub Jelinek authored
2009-10-08 Jakub Jelinek <jakub@redhat.com> * gcc.dg/debug/vta-2.c: New test. 2009-09-30 Alexandre Oliva <aoliva@redhat.com> * gcc.dg/debug/vta-1.c: New. From-SVN: r152986
-
Eric Botcazou authored
* gimple-low.c (struct lower_data): Add cannot_fallthru field. (lower_stmt) <GIMPLE_BIND>: Add comment. <GIMPLE_COND, GIMPLE_GOTO, GIMPLE_SWITCH>: Set cannot_fallthru to true and return. <GIMPLE_RETURN>: Remove the statement if cannot_fallthru is set. Otherwise lower it and set cannot_fallthru to true. <GIMPLE_TRY>: Update cannot_fallthru for GIMPLE_TRY_FINALLY and return. <GIMPLE_CATCH, GIMPLE_EH_FILTER>; Set cannot_fallthru to false. <GIMPLE_CALL>: Set cannot_fallthru to false for BUILT_IN_SETJMP and to true for a noreturn call. Do not remove statements. <GIMPLE_OMP_PARALLEL, GIMPLE_OMP_TASK>: Set cannot_fallthru to false. Set cannot_fallthru to false on function exit. (gimple_stmt_may_fallthru) <GIMPLE_SWITCH>: Really return false. <GIMPLE_ASSIGN>: Remove. From-SVN: r152984
-
Tobias Burnus authored
2009-10-19 Tobias Burnus <burnus@net-b.de> Steven G. Kargl <kargl@gcc.gnu.org> PR fortran/41755 * symbol.c (gfc_undo_symbols): Add NULL check. * match.c (gfc_match_equivalence): Add check for missing comma. 2009-10-19 Tobias Burnus <burnus@net-b.de> PR fortran/41755 * gfortran.dg/equiv_8.f90: New test. * gfortran.dg/class_allocate_1.f03: Remove obsolete FIXME. Co-Authored-By:
Steven G. Kargl <kargl@gcc.gnu.org> From-SVN: r152983
-
Rafael Espindola authored
From-SVN: r152982
-
Andreas Krebbel authored
2009-10-19 Andreas Krebbel <Andreas.Krebbel@de.ibm.com> * config/s390/s390.c (s390_z10_optimize_cmp): Don't touch FP compares. From-SVN: r152979
-
Andreas Krebbel authored
2009-10-19 Andreas Krebbel <Andreas.Krebbel@de.ibm.com> * config/s390/s390.c (s390_z10_optimize_cmp): Use next/prev_active_insn to skip DEBUG_INSNs as well. From-SVN: r152978
-
Joseph Myers authored
* config/arm/arm.c (output_move_neon): Use DImode in call to adjust_address. testsuite: * gcc.target/arm/neon-thumb2-move.c: New test. From-SVN: r152977
-
Rafael Espindola authored
include/ 2009-10-09 Rafael Avila de Espindola <espindola@google.com> PR40790 * plugin-api.h: Don't include stdint.h unconditionally. lto-plugin/ 2009-10-09 Rafael Avila de Espindola <espindola@google.com> PR40790 * configure: Regenerate. * configure.ac: Add AC_TYPE_UINT64_T. From-SVN: r152976
-
Matthias Klose authored
2009-10-19 Matthias Klose <doko@ubuntu.com> PR target/40134 * config.gcc (arm*-*-linux-*eabi): Use config/t-slibgcc-libgcc. From-SVN: r152975
-
Richard Guenther authored
2009-10-18 Richard Guenther <rguenther@suse.de> PR fortran/41494 * trans-expr.c (gfc_trans_scalar_assign): Do not call gfc_evaluate_now. From-SVN: r152973
-
Jakub Jelinek authored
* cfgexpand.c (expand_debug_expr): Fail if bitpos < 0 for non-MEM op0. * gcc.dg/debug/vta-3.c: New test. From-SVN: r152972
-
GCC Administrator authored
From-SVN: r152970
-
- Oct 18, 2009
-
-
GCC Administrator authored
From-SVN: r152964
-
- Oct 17, 2009
-
-
Andy Hutchinson authored
2009-10-17 Andy Hutchinson <hutchinsonandy@gcc.gnu.org> PR middle-end/41738 * optabs.c (expand_binop): Make mode of shift count expression mode of shift count not target. Remove indent nit. From-SVN: r152961
-
Eric Botcazou authored
* tree-nested.c (convert_nonlocal_reference_stmt) <GIMPLE_COND>: New case. Force using values to replace references within the statement. (convert_local_reference_stmt): Likewise. From-SVN: r152960
-
Eric Botcazou authored
* gimple-low.c (lower_stmt) <GIMPLE_CALL>: If the call is noreturn, remove a subsequent GOTO or RETURN statement. From-SVN: r152959
-
Andy Hutchinson authored
2009-10-17 Andy Hutchinson <hutchinsonandy@aim.com> * config/avr.md (*movqi): Add zero as equally preferable constraint as general register. (*movhi): Ditto. From-SVN: r152958
-
Janus Weil authored
2009-10-17 Janus Weil <janus@gcc.gnu.org> Paul Thomas <pault@gcc.gnu.org> PR fortran/41608 * decl.c (gfc_match_data_decl): Add BT_CLASS for undefined type and empty type errors. * parse.c (gfc_build_block_ns): Only set recursive if parent ns has a proc_name. PR fortran/41629 PR fortran/41618 PR fortran/41587 * gfortran.h : Add class_ok bitfield to symbol_attr. * decl.c (build_sym): Set attr.class_ok if dummy, pointer or allocatable. (build_struct): Use gfc_try 't' to carry errors past the call to encapsulate_class_symbol. (attr_decl1): For a CLASS object, apply the new attribute to the data component. * match.c (gfc_match_select_type): Set attr.class_ok for an assigned selector. * resolve.c (resolve_fl_variable_derived): Check a CLASS object is dummy, pointer or allocatable by testing the class_ok and the use_assoc attribute. 2009-10-17 Janus Weil <janus@gcc.gnu.org> Paul Thomas <pault@gcc.gnu.org> PR fortran/41629 * gfortran.dg/class_6.f90: New test. PR fortran/41608 PR fortran/41587 * gfortran.dg/class_7.f90: New test. PR fortran/41618 * gfortran.dg/class_8.f90: New test. Co-Authored-By:
Paul Thomas <pault@gcc.gnu.org> From-SVN: r152955
-
Eric Botcazou authored
From-SVN: r152954
-
Richard Guenther authored
2009-10-17 Richard Guenther <rguenther@suse.de> * lto-streamer-in.c (lto_input_location): Try to reuse previous maps. From-SVN: r152953
-
Richard Guenther authored
2009-10-17 Richard Guenther <rguenther@suse.de> * gcc.dg/lto/20091017-1_0.c: New testcase. * gcc.dg/lto/20091017-1_1.c: Likewise. From-SVN: r152952
-
Joseph Myers authored
From-SVN: r152951
-
Joseph Myers authored
From-SVN: r152950
-
Eric Botcazou authored
From-SVN: r152938
-
Richard Guenther authored
2009-10-17 Richard Guenther <rguenther@suse.de> * lto-streamer-in.c (input_gimple_stmt): Fixup FIELD_DECL operands in COMPONENT_REFs. From-SVN: r152937
-
Eric Botcazou authored
From-SVN: r152936
-
Eric Botcazou authored
* gcc-interface/utils.c (convert): When converting to a padded type with an inner type of self-referential size, pad the expression before doing the unchecked conversion. From-SVN: r152935
-
Eric Botcazou authored
* gcc-interface/utils2.c (build_binary_op) <ARRAY_RANGE_REF>: Make sure the element type is consistent. From-SVN: r152934
-
Anatoly Sokolov authored
* targhooks.c (default_libcall_value): Don't use LIBCALL_VALUE macro if not defined. Change type of second argument to const_rtx. (default_function_value): Call gcc_unreachable if FUNCTION_VALUE macro not defined. * targhooks.h (default_libcall_value): Update prototype. * target.h (struct gcc_target): Change type of second argument of libcall_value to const_rtx. * config/arm/arm.c (arm_libcall_value): Change type of second argument to const_rtx. (arm_libcall_uses_aapcs_base): Change type of argument to const_rtx. * doc/tm.texi (TARGET_LIBCALL_VALUE): Revise documentation. From-SVN: r152933
-
Eric Botcazou authored
From-SVN: r152932
-
Ralf Wildenhues authored
libgomp/: PR libgomp/41418 * configure.ac: Set FC to "no" if $GFORTRAN starts with "no" or a hyphen (happens with fortran language disabled). * configure: Regenerate. From-SVN: r152931
-
Jakub Jelinek authored
PR debug/40521 * debug.h (struct gcc_debug_hooks): Add assembly_start hook. * cgraphunit.c (cgraph_optimize): Call it. * dwarf2out.c (dwarf2out_init): Move .cfi_sections printing into... (dwarf2out_assembly_start): ... here. New hook. (dwarf2out_debug_hooks): Add dwarf2out_assembly_start. * debug.c (do_nothing_debug_hooks): Do nothing for assembly_start hook. * dbxout.c (dbx_debug_hooks, xcoff_debug_hooks): Likewise. * sdbout.c (sdb_debug_hooks): Likewise. * vmsdbgout.c (vmsdbg_debug_hooks): Add vmsdbgout_assembly_start. (vmsdbgout_assembly_start): New hook. From-SVN: r152930
-
Alexandre Oliva authored
From-SVN: r152929
-
Alexandre Oliva authored
* print-rtl.c (print_rtx): Print locators in asm_operands and asm_input. From-SVN: r152928
-
Alexandre Oliva authored
PR debug/41535 * sched-deps.c (depl_on_debug_p): New. (attach_dep_link): Reject debug deps before nondebug deps. (add_to_deps_list): Insert debug deps after nondebug deps. (sd_lists_empty_p): Stop at first nonempty list. Disregard debug deps. (sd_add_dep): Do not reject debug deps. (add_insn_mem_dependence): Don't count debug deps. (remove_from_deps): Likewise. (sched_analyze_2): Set up mem deps on debug insns. (sched_analyze_insn): Record reg uses for deps on debug insns. * haifa-sched.c (schedule_insn): Reset deferred debug insn. Don't try_ready nondebug insn after debug insn. * ddg.c (create_ddg_dep_from_intra_loop_link, create_ddg_dep_no_link): Don't reject debug deps. From-SVN: r152927
-
Jason Merrill authored
PR c++/38888 * error.c (dump_template_bindings): Wrap argument packs in {}. From-SVN: r152925
-
Jason Merrill authored
PR c++/38798 * parser.c (CP_PARSER_FLAGS_NO_TYPE_DEFINITIONS): New. (cp_parser_type_specifier): Don't try to parse a class-specifier or enum-specifier in that case. (cp_parser_trailing_type_id): New. (cp_parser_late_return_type_opt): Call it. (cp_parser_type_id_1): Add is_trailing_return parm. (cp_parser_type_specifier_seq): Likewise. From-SVN: r152924
-