- Aug 01, 2010
-
-
Gerald Pfeifer authored
* update_web_docs_libstdcxx_svn: Do not compress generated .html files any more. From-SVN: r162805
-
Janus Weil authored
2010-08-01 Janus Weil <janus@gcc.gnu.org> PR fortran/44912 * class.c (gfc_build_class_symbol): Make '$vptr' component private. (gfc_find_derived_vtab): Make vtabs and vtypes public. * module.c (read_module): When reading module files, always import vtab and vtype symbols. 2010-08-01 Janus Weil <janus@gcc.gnu.org> PR fortran/44912 * gfortran.dg/typebound_call_17.f03: New. From-SVN: r162804
-
Janne Blomqvist authored
From-SVN: r162798
-
Uros Bizjak authored
PR target/45142 * config/i386/sse.md (vec_set<mode>_0): Do not set mode attribute for alternative 2. (vec_set<moode>_0 splitter): Use SSEMODE4S mode iterator to also split V4SI operands. From-SVN: r162797
-
Anatoly Sokolov authored
* config/mmix/mmix.h (ASM_OUTPUT_SOURCE_FILENAME): Remove macro. * config/mmix/mmix-protos.h (mmix_asm_output_source_filename): Remove. * config/mmix/mmix.c (mmix_asm_output_source_filename): Make static. (TARGET_ASM_OUTPUT_SOURCE_FILENAME): Define. From-SVN: r162793
-
GCC Administrator authored
From-SVN: r162792
-
- Jul 31, 2010
-
-
David Edelsohn authored
From-SVN: r162788
-
Kai Tietz authored
2010-07-31 Kai Tietz <kai.tietz@onevision.com> * cppdefault.c (cpp_include_defaults): Move GCC_INCLUDE_DIR before LOCAL_INCLUDE_DIR. From-SVN: r162787
-
Ulrich Weigand authored
From-SVN: r162785
-
Richard Sandiford authored
tree-ssa-math-opts.c (convert_plusminus_to_widen): Fix type used in the call to optab_for_tree_code. gcc/ * tree-ssa-math-opts.c (convert_plusminus_to_widen): Fix type used in the call to optab_for_tree_code. Fix the second is_widening_mult_p call. Check that both unwidened operands have the same sign. From-SVN: r162784
-
John Tytgat authored
John Tytgat <John.Tytgat@aaug.net> * config/arm/arm.c (arm_function_arg): Remove superfluous test. From-SVN: r162782
-
Anatoly Sokolov authored
* config/spu/spu.h (ASM_OUTPUT_SOURCE_FILENAME): Remove macro. From-SVN: r162779
-
Mikael Morin authored
2010-07-31 Mikael Morin <mikael@gcc.gnu.org> PR fortran/42051 PR fortran/44064 * symbol.c (changed_syms): Made non-static. * parse.c (changed_syms): Declare new external. (next_statement): Assert changed_syms is NULL at the beginning. From-SVN: r162776
-
Uros Bizjak authored
i386.md (mov<SWIM:mode>cc and corresponding splitter): Use ordered_comparison_operator predicate for operator1. * config/i386/i386.md (mov<SWIM:mode>cc and corresponding splitter): Use ordered_comparison_operator predicate for operator1. (add<mode>cc): ditto. From-SVN: r162775
-
DJ Delorie authored
* config/rx/predicates.md (rx_constshift_operand): New. * config/rx/rx.md (zs_cond): New. (cbranchsi4): Remove mode. (*cbranchsi4_<code>): Likewise. (*tstbranchsi4_<code>): New. (*tstbranchsi4r_<code>): New. (*tstbranchsi4m_eq): New. (*tstbranchsi4m_ne): New. (cbranchsf4): Remove mode. (*cbranchsf4_<code>): Likewise. From-SVN: r162731
-
GCC Administrator authored
From-SVN: r162730
-
- Jul 30, 2010
-
-
Bernd Schmidt authored
* rtlanal.c (simplify_subreg_regno): Don't treat HARD_FRAME_POINTER_REGNUM specially. From-SVN: r162726
-
Janus Weil authored
2010-07-30 Janus Weil <janus@gcc.gnu.org> Steven G. Kargl <kargl@gcc.gnu.org> PR fortran/44929 * match.c (match_type_spec): Try to parse derived types before intrinsic types. 2010-07-30 Janus Weil <janus@gcc.gnu.org> PR fortran/44929 * gfortran.dg/allocate_derived_3.f90: New. Co-Authored-By:
Steven G. Kargl <kargl@gcc.gnu.org> From-SVN: r162724
-
Joseph Myers authored
* common.opt (-G): Don't define option here. * config/g.opt: New. * config.gcc: Use g.opt for alpha, frv, ia64, lm32, m32r, mips, rs6000/powerpc and score targets. * opts.c (common_handle_option): Don't handle -G here. * config/alpha/alpha.c (alpha_handle_option): Handle -G. * config/frv/frv.c (frv_handle_option): Handle -G. * config/ia64/ia64.c (ia64_handle_option): Handle -G. * config/lm32/lm32.c (lm32_handle_option, TARGET_HANDLE_OPTION): New. * config/m32r/m32r.c (m32r_handle_option): Handle -G. * config/mips/mips.c (mips_handle_option): Handle -G. * config/rs6000/rs6000.c (rs6000_handle_option) Handle -G. * config/score/score.c (score_handle_option): Handle -G. From-SVN: r162721
-
Xinliang David Li authored
From-SVN: r162720
-
Mikael Morin authored
2010-07-30 Mikael Morin <mikael@gcc.gnu.org> * gfortran.h (gfc_release_symbol): New prototype. * symbol.c (gfc_release_symbol): New. Code taken from free_sym_tree. (gfc_undo_symbols, free_sym_tree, gfc_free_finalizer): Use gfc_release_symbol. * parse.c (gfc_fixup_sibling_symbols): Ditto. * resolve.c (resolve_symbol): Ditto. From-SVN: r162719
-
Anatoly Sokolov authored
* config/mmix/mmix.c: Include basic-block.h. From-SVN: r162718
-
Ulrich Weigand authored
gcc/ PR c++/45112 * cp/decl.c (duplicate_decls): Merge DECL_USER_ALIGN and DECL_PACKED. gcc/testsuite/ PR c++/45112 * testsuite/g++.dg/pr45112.C: New test. From-SVN: r162716
-
Jakub Jelinek authored
PR debug/45055 PR rtl-optimization/45137 * rtl.h (prev_nonnote_nondebug_insn, next_nonnote_nondebug_insn): New prototypes. * emit-rtl.c (prev_nonnote_nondebug_insn, next_nonnote_nondebug_insn): New functions. * combine.c (next_nonnote_nondebug_insn): Removed. * ifcvt.c (noce_process_if_block): Use prev_nonnote_nondebug_insn. * haifa-sched.c (queue_to_ready): Use next_nonnote_nondebug_insn. * sched-deps.c (sched_analyze_insn): Likewise. (fixup_sched_groups, deps_start_bb): Use prev_nonnote_nondebug_insn. * rtlanal.c (canonicalize_condition): Likewise. * postreload.c (reload_combine_recognize_pattern): Likewise. (reload_cse_move2add): Use next_nonnote_nondebug_insn. * gcc.dg/pr45055.c: New test. From-SVN: r162714
-
Uros Bizjak authored
* config/i386/i386.md (int_cond): Remove code iterator. (fp_cond): Ditto. (cbranch<mode>4): Use ordered_comparison_operator predicate for operator0. (cstore<mode>4): Ditto for operator1. (mov<SWIM:mode>cc): Ditto. From-SVN: r162710
-
Richard Guenther authored
2010-07-30 Richard Guenther <rguenther@suse.de> PR middle-end/45141 * expr.c (expand_expr_real_1): Check for not handled base address. From-SVN: r162709
-
Andrew Haley authored
2010-07-30 Andrew Haley <aph@redhat.com> * javax/print/attribute/standard/JobStateReasons.java (add): Fix infinite recursion with call to super. From-SVN: r162708
-
Richard Guenther authored
2010-07-30 Richard Guenther <rguenther@suse.de> * ipa-prop.c (ipa_modify_formal_parameters): Use build_distinct_type_copy. From-SVN: r162707
-
Anthony Green authored
From-SVN: r162706
-
Alan Modra authored
From-SVN: r162705
-
GCC Administrator authored
From-SVN: r162701
-
- Jul 29, 2010
-
-
Bernd Schmidt authored
* dce.c (run_word_dce): Take flag_dce into account. Clear and restore df flags as in run_fast_df_dce. From-SVN: r162697
-
Tobias Burnus authored
2010-07-29 Tobias Burnus <burnus@net-b.de> PR fortran/45087 PR fortran/45125 * trans-decl.c (gfc_get_extern_function_decl): Correctly handle external procedure declarations in modules. (gfc_get_symbol_decl): Modify assert. 2010-07-29 Tobias Burnus <burnus@net-b.de> PR fortran/45087 PR fortran/45125 * gfortran.dg/whole_file_25.f90: New. * gfortran.dg/whole_file_26.f90: New. * gfortran.dg/whole_file_27.f90: New. From-SVN: r162696
-
Janus Weil authored
2010-07-29 Janus Weil <janus@gcc.gnu.org> PR fortran/44962 * resolve.c (resolve_fl_derived): Call gfc_resolve_array_spec. 2010-07-29 Janus Weil <janus@gcc.gnu.org> PR fortran/44962 * gfortran.dg/typebound_proc_17.f03: New. From-SVN: r162695
-
Jakub Jelinek authored
Revert: * rtl.def (NOTE): Swap operands 4 and 5. * rtl.h (NOTE_DATA, NOTE_DELETED_LABEL_NAME, NOTE_BLOCK, NOTE_EH_HANDLER, NOTE_BASIC_BLOCK, NOTE_VAR_LOCATION, NOTE_KIND): Adjust accordingly. * gengtype.c (adjust_field_rtx_def): Swap operands 4 and 5 of NOTEs. From-SVN: r162692
-
Jakub Jelinek authored
PR debug/45110 * dwarf2out.c (dwarf_attr_name): Handle DW_AT_object_pointer. (gen_formal_types_die): Add DW_AT_object_pointer in methods. (gen_subprogram_die): Likewise. Remove it when removing declaration's formal parameters. (gen_decl_die): Change return type to dw_die_ref, return what gen_formal_parameter_die returned. From-SVN: r162691
-
Janus Weil authored
2010-07-29 Janus Weil <janus@gcc.gnu.org> PR fortran/45004 * trans-stmt.h (gfc_trans_class_init_assign): New prototype. (gfc_trans_class_assign): Modified prototype. * trans.h (gfc_conv_intrinsic_move_alloc): New prototype. * trans-expr.c (gfc_trans_class_init_assign): Split off from ... (gfc_trans_class_assign): ... here. Modified actual arguments. * trans-intrinsic.c (gfc_conv_intrinsic_move_alloc): New function to handle the MOVE_ALLOC intrinsic with scalar and class arguments. * trans.c (trans_code): Call 'gfc_conv_intrinsic_move_alloc'. 2010-07-29 Janus Weil <janus@gcc.gnu.org> PR fortran/45004 * gfortran.dg/move_alloc_2.f90: New. From-SVN: r162688
-
Xinliang David Li authored
From-SVN: r162687
-
Martin Jambor authored
2010-07-29 Martin Jambor <mjambor@suse.cz> * dbgcnt.def (eipa_sra): New counter. * tree-sra.c (ipa_early_sra_gate): Also check eipa_sra debug counter. From-SVN: r162686
-
Xinliang David Li authored
2010-07-29 Xinliang David Li <davidxl@google.com> PR bootstrap/45119 * tree-ssa-loop-ivopts.c (get_address_cost): Revert change in revision 162652. From-SVN: r162683
-