- Sep 05, 2008
-
-
Richard Guenther authored
2008-09-05 Richard Guenther <rguenther@suse.de> * configure.ac: Initialize clooglibs to -lcloog. * configure: Re-generate. From-SVN: r140032
-
Paolo Bonzini authored
2008-09-05 Paolo Bonzini <bonzini@gnu.org> * emit-rtl.c (gen_rtvec): Rewrite not using gen_rtvec_v. (gen_rtvec_v): Fix coding standards. From-SVN: r140031
-
Jan Hubicka authored
* i386.c (decide_alg): Be more conservative about optimizing for size. * gcc.target/i386/cold-attribute-1.c: Update testcase. From-SVN: r140030
-
Ian Lance Taylor authored
./: * varasm.c (narrowing_initializer_constant_valid_p): New static function. (initializer_constant_valid_p): Call it. testsuite/: * g++.dg/init/const7.C: New test. From-SVN: r140025
-
Jeff Law authored
* fold-const.c (native_encode_real): Fix computation of WORDS. (native_interpret_real): Likewise. From-SVN: r140023
-
Janis Johnson authored
From-SVN: r140020
-
GCC Administrator authored
From-SVN: r140018
-
- Sep 04, 2008
-
-
Vladimir Makarov authored
ira-conflicts.c (process_regs_for_copy): Check insn to check that the cost is already taken into account in ira-costs.c 2008-09-04 Vladimir Makarov <vmakarov@redhat.com> * ira-conflicts.c (process_regs_for_copy): Check insn to check that the cost is already taken into account in ira-costs.c * ira-int.h (ira_debug_copy, ira_debug_copies): New. * ira-build.c (print_copy, print_copies, ira_debug_copy, ira_debug_copies): New. (ira_bulid): Call print_copies. * doc/tm.texi (IRA_COVER_CLASSES): Fix the description. From-SVN: r140014
-
Samuel Tardieu authored
re PR other/32783 (gcc-4_3-trunk/libiberty/configure - for ac_func gettimeofday ... gettimeofday - tests twice) 2008-09-04 Samuel Tardieu <sam@rfc1149.net> PR target/32783 * config/rs6000/rs6000.c (optimization_options): Remove check of flag_toplevel_order. From-SVN: r140013
-
Jonathan Wakely authored
re PR libstdc++/36962 ([C++0x] Add constructors / assignment operators from unique_ptr to shared_ptr) PR libstdc++/36962 * include/Makefile.am: Update headers. * include/Makefile.in: Regenerate. * include/std/memory: Update headers. * include/tr1/memory: Likewise. * include/tr1_impl/boost_shared_ptr.h: Remove, splitting into separate implementations for std and tr1. * include/bits/boost_sp_shared_count.h: Remove. * include/tr1/boost_sp_shared_count.h: Remove. * include/bits/shared_ptr.h: New. Combines boost_sp_shared_count.h and boost_shared_ptr.h into one file. (__shared_count,__shared_ptr,shared_ptr,swap): Add unique_ptr and rvalue-reference support as per current WP. * include/tr1/shared_ptr.h: New. Combines boost_sp_shared_count.h and boost_shared_ptr.h into one file. * testsuite/20_util/shared_ptr/cons/unique_ptr.cc: New. * testsuite/20_util/shared_ptr/cons/unique_ptr_deleter.cc: New. * testsuite/20_util/shared_ptr/cons/unique_ptr_deleter_ref.cc: New. * testsuite/20_util/shared_ptr/cons/unique_ptr_neg.cc: New. * testsuite/20_util/shared_ptr/assign/auto_ptr_rvalue.cc: New. * testsuite/20_util/shared_ptr/assign/unique_ptr_lvalue_neg.cc: New. * testsuite/20_util/shared_ptr/assign/unique_ptr_rvalue.cc: New. * testsuite/20_util/shared_ptr/modifiers/swap_rvalue.cc: New. * testsuite/20_util/shared_ptr/assign/auto_ptr_rvalue_neg.cc: Remove. From-SVN: r140012
-
Adam Nemet authored
* config/mips/mips.h (ISA_HAS_SEQ_SNE): New macro. * config/mips/mips.c (mips_expand_scc): Also expand seq and sne if second operand is a reg_imm10_operand. * config/mips/mips.md (*seq_<GPR:mode><GPR2:mode>_seq, *sne_<GPR:mode><GPR2:mode>_sne): New patterns. (*seq_<GPR:mode><GPR2:mode>): Rename to *seq_zero_<GPR:mode><GPR2:mode>. Don't match if ISA_HAS_SEQ_SNE. (*seq_<GPR:mode><GPR2:mode>_mips16): Rename to *seq_zero_<GPR:mode><GPR2:mode>_mip16. Don't match if ISA_HAS_SEQ_SNE. (*sne_<GPR:mode><GPR2:mode>): Rename to *sne_zero_<GPR:mode><GPR2:mode>. Don't match if ISA_HAS_SEQ_SNE. testsuite/ * gcc.target/mips/seq-1.c: New test. * gcc.target/mips/octeon-seq-1.c: New test. * gcc.target/mips/octeon-seq-2.c: New test. * gcc.target/mips/octeon-seq-3.c: New test. * gcc.target/mips/octeon-seq-4.c: New test. * gcc.target/mips/scc-2.c: Also pass on sltiu. * gcc.target/mips/scc-3.c: Likewise. From-SVN: r140010
-
Adam Nemet authored
* config/mips/mips.h (ISA_HAS_EXTS): New macro. * config/mips/mips.md (*ashr_trunc<mode>): Name the pattern combining an arithmetic right shift by more than 31 and a trunction. Don't match for out-of-range shift amounts. Set attribute mode to <MODE>. (*lshr32_trunc<mode>): Name the pattern combining a logical right shift by 32 and and a truncation. Set attribute mode to <MODE>. (*<optab>_trunc<mode>_exts): New pattern for truncated right shifts by less than 32. (extv): Change predicate on first operand to accept registers. Change predicate of the other operands from immediate_operand to const_int_operand. Expand exts when source is a register. (extzv): Change predicate of the constant operands from immediate_operand to const_int_operand. (extzv<mode>): Change predicate of the constant operands from immediate_operand to const_int_operand and no constraint. Also remove mode. (*extzv_trunc<mode>_exts): New pattern. testsuite/ * gcc.target/mips/truncate-2.c: New test. * gcc.target/mips/octeon-exts-1.c: New test. * gcc.target/mips/octeon-exts-2.c: New test. * gcc.target/mips/octeon-exts-3.c: New test. * gcc.target/mips/octeon-exts-4.c: New test. From-SVN: r140009
-
Adam Nemet authored
* config/mips/mips.h (ISA_HAS_CINS): New macro. * config/mips/mips-protos.h (mask_low_and_shift_p, mask_low_and_shift_len): Declare. * config/mips/mips.c (mask_low_and_shift_p, mask_low_and_shift_len): New functions. (mips_print_operand): Handle new operand prefix "m". * config/mips/mips.md (*cins<mode>): New pattern. testsuite/ * gcc.target/mips/octeon-cins-1.c: New test. * gcc.target/mips/octeon-cins-2.c: New test. From-SVN: r140008
-
Le-Chun Wu authored
From-SVN: r140005
-
Jonathan Wakely authored
From-SVN: r140003
-
Richard Guenther authored
2008-09-04 Richard Guenther <rguenther@suse.de> * trans-array.c (gfc_conv_array_parameter): Use correct types in building COND_EXPRs. * trans-expr.c (gfc_conv_missing_dummy): Likewise. * trans-intrinsics.c (gfc_conv_intrinsic_merge): Likewise. * gfortran.dg/internal_pack_4.f90: Adjust pattern. From-SVN: r140001
-
Bernd Schmidt authored
* config/bfin/bfin.c (gen_one_bundle): Don't create new nops when optimizing for size. From-SVN: r139999
-
Richard Sandiford authored
gcc/ * df-scan.c (df_get_entry_block_def_set): Add STACK_POINTER_REGNUM regardless of epilogue_completed. From-SVN: r139998
-
Daniel Kraft authored
2008-09-04 Daniel Kraft <d@domob.eu> * PR fortran/37099 * expr.c (simplify_const_ref): Update expression's character length when pulling out a substring reference. 2008-09-04 Daniel Kraft <d@domob.eu> PR fortran/37099 * gfortran.dg/string_compare_1.f90: New text. * gfortran.dg/string_compare_2.f90: New text. * gfortran.dg/string_compare_3.f90: New text. From-SVN: r139997
-
Vladimir Makarov authored
2008-09-04 Vladimir Makarov <vmakarov@redhat.com> PR middle-end/37359 * ira-lives.c (process_bb_node_lives): Check setjmp. From-SVN: r139996
-
Paolo Carlini authored
2008-09-04 Paolo Carlini <paolo.carlini@oracle.com> * acinclude.m4 ([GLIBCXX_CHECK_GTHREADS]): Tidy checks in case of POSIX threads. * configure: Regenerate. From-SVN: r139994
-
Richard Sandiford authored
gcc/ PR middle-end/37243 * ira-build.c (form_loop_tree): Reverse BB walk. (create_bb_allocnos): Likewise. * ira-lives.c (make_regno_born_and_dead, regs_set): Delete. (mark_reg_store): Rename to... (mark_ref_live): ...this and take a df_ref argument instead of note_stores arguments. Assert that we have a register. (mark_reg_clobber): Delete. (def_conflicts_with_inputs_p): New function. (mark_reg_conflicts): Delete. (mark_reg_death): Rename to... (mark_ref_dead): ...this and take a df_ref argument instead of a register. Assert that we have a register. (process_bb_node_lives): Hoist frequency calculation out of instruction walk. Convert from a forwards scan to a backwards scan. Use DF_REF_USES and DF_REF_DEFS instead of register notes and note_stores. Remove EH_RETURN_DATA_REGNO and regs_set handling. (create_allocno_live_ranges): Don't create regs_set. From-SVN: r139993
-
Ian Lance Taylor authored
./: * rtl.h (LABEL_REF_NONLOCAL_P): Don't check for REG_LABEL_OPERAND or REG_LABEL_TARGET. * calls.c (emit_library_call_value_1): Use MEM_P rather than comparing MODE with MEM. * gimple.c (gimple_build_predict): Cast END_PREDICTORS before comparing with GF_PREDICT_TAKEN. (gimple_get_lhs): Change code to enum gimple_code. (gimple_set_lhs): Likewise. * ifcvt.c (noce_process_if_block): Correct GET_MODE to GET_CODE. * omp-low.c (find_omp_clause): Change kind parameter to enum omp_clause_code. * tree-flow.h (find_omp_clause): Update declaration. * regrename.c (clear_dead_regs): Change kind parameter to enum reg_note. * reload1.c (eliminate_regs_1): Use REG_NOTE_KIND rather than GET_MODE. * see.c (see_get_extension_data): Change return type to enum entry_type. Change UNKNOWN to NOT_RELEVANT, SIGN_EXTEND to SIGNED_EXTENDED_DEF, ZERO_EXTEND to ZERO_EXTENDED_DEF. (see_gen_normalized_extension): Change extension_code parameter to enum entry_type. (see_seek_pre_extension_expr): Change extension_code to enum entry_type. (see_merge_one_def_extension): Likewise. (see_handle_relevant_defs): Likewise. (see_handle_relevant_uses): Likewise. (see_analyze_one_def): Likewise. * tree-cfg.c (need_fake_edge_p): Compare gimple code with GIMPLE_ASM rather than ASM_EXPR. * tree-ssa-alias.c (is_escape_site): Compare gimple code with GIMPLE_RETURN rather than RETURN_EXPR. * tree-ssa-ccp.c (likely_value): Change code to enum gimple_code. (evaluate_stmt): Likewise. * tree-vect-analyze.c (vect_analyze_operations): Change relevance to enum vect_relevant. (vect_mark_stmts_to_be_vectorized): Change assertion to not compare gimple codes with tree codes. cp/: * parser.c (check_no_duplicate_clause): Change code parameter to enum omp_clause_code. fortran/: * symbol.c (generate_isocbinding_symbol): Compare gfc_notification_std with ERROR rather than FAILURE. * resolve.c (check_assumed_size_reference): Compare array type with AR_FULL rather than DIMEN_ELEMENT. (resolve_actual_arglist): Compare with EXPR_VARIABLE rather than FL_VARIABLE. From-SVN: r139991
-
Paul Brook authored
2008-09-04 Paul Brook <paul@codesourcery.com> * config/arm/arm.c (arm_size_rtx_costs): Call cost function. From-SVN: r139990
-
Bernd Schmidt authored
bfin.c (bfin_function_ok_for_sibcall): Restore a null pointer check lost in the recent no-unit-at-a-time patch. * config/bfin/bfin.c (bfin_function_ok_for_sibcall): Restore a null pointer check lost in the recent no-unit-at-a-time patch. From-SVN: r139989
-
H.J. Lu authored
2008-09-04 H.J. Lu <hongjiu.lu@intel.com> PR rtl-optimization/37243 * gfortran.dg/pr37243.f: New. From-SVN: r139987
-
Chris Fairles authored
mutex (once_flag): Construct __gthread_once_t in a temporary variable before assigning to _M_once... 2008-09-04 Chris Fairles <chris.fairles@gmail.com> * include/std/mutex (once_flag): Construct __gthread_once_t in a temporary variable before assigning to _M_once to avoid initialization errors. From-SVN: r139986
-
Jan Hubicka authored
PR middle-end/37343 * tree-switch-conversion.c (check_final_bb): Accept only IP invariants. * g++.dg/torture/pr37343.C New file. From-SVN: r139983
-
Ira Rosen authored
* gcc.dg/vect/slp-perm-1.c: Add call to check_vect. * gcc.dg/vect/slp-perm-2.c, gcc.dg/vect/slp-perm-3.c, gcc.dg/vect/slp-perm-4.c, gcc.dg/vect/slp-perm-5.c, gcc.dg/vect/slp-perm-6.c, gcc.dg/vect/slp-perm-7.c, gcc.dg/vect/slp-perm-8.c, gcc.dg/vect/slp-perm-9.c: Likewise. From-SVN: r139982
-
Jan Hubicka authored
* tree-vrp.c (vrp_evaluate_conditional_warnv_with_ops_using_ranges): Break out from ... (vrp_evaluate_conditional_warnv_with_ops): ... this one. Add using_ranges argument. (vrp_evaluate_conditional): Avoid bogus warning for type range. (vrp_visit_cond_stmt): Update call of vrp_evaluate_conditional_warnv_with_ops From-SVN: r139981
-
Jan Hubicka authored
PR tree-optimization/37345 PR tree-optimization/37358 PR tree-optimization/37357 * tree.c (build_function_type_skip_args): Build distinct type copy; set TYPE_CONTEXT. (build_function_decl_skip_args): Set type of new decl not orig decl; clear DECL_VINDEX for methods turned into functions. From-SVN: r139980
-
Nick Clifton authored
* configure.ac (HAVE_GAS_LCOMM_WITH_ALIGNMENT): New assembler check. * configure: Regenerate. * config.in: Regenerate. * config/i386/bsd.h (ASM_OUTPUT_ALIGNED_LOCAL): Use .lcomm with an alignment field, if it is supported. From-SVN: r139979
-
Kai Tietz authored
2008-09-04 Kai Tietz <kai.tietz@onevision.com> * config/i386/t-mingw32 (SHLIB_LC): Change order of import libraries. From-SVN: r139977
-
Sebastian Pop authored
2008-09-03 Sebastian Pop <sebastian.pop@amd.com> * configure.ac (--with-cloog-polylib): New. (--disable-cloog-version-check): New. (--disable-ppl-version-check): New. * configure: Re-generate. From-SVN: r139973
-
Tobias Grosser authored
* gcc/testsuite/lib/target-supports.exp (check_effective_target_fgraphite): Fix test. Graphite is only available with -O1. From-SVN: r139970
-
David Edelsohn authored
2008-09-03 David Edelsohn <edelsohn@gnu.org> * config/rs6000/rs6000.c (processor_target_table): Do not enable VMX for POWER6. 2008-09-03 Anton Blanchard <anton@samba.org> * config/rs6000/rs6000.c (rs6000_split_lock_test_and_set): Do not emit memory barrier before operation. From-SVN: r139969
-
Paolo Carlini authored
2008-09-03 Paolo Carlini <paolo.carlini@oracle.com> * config/abi/pre/gnu.ver: Also export __once_functor_lock; tighten GLIBCXX_3.4 exports (necessary in case of undef _GLIBCXX_HAVE_TLS). * Makefile.in: Regenerate. * src/Makefile.in: Likewise. * doc/Makefile.in: Likewise. * po/Makefile.in: Likewise. * libmath/Makefile.in: Likewise. * include/Makefile.in: Likewise. * libsupc++/Makefile.in: Likewise. * testsuite/Makefile.in: Likewise. From-SVN: r139968
-
GCC Administrator authored
From-SVN: r139966
-
- Sep 03, 2008
-
-
Paolo Carlini authored
acinclude.m4 ([GLIBCXX_CHECK_GTHREADS]): Fix typo in last commit, check _POSIX_TIMEOUTS, not _POSIX_TIMERS. 2008-09-03 Paolo Carlini <paolo.carlini@oracle.com> * acinclude.m4 ([GLIBCXX_CHECK_GTHREADS]): Fix typo in last commit, check _POSIX_TIMEOUTS, not _POSIX_TIMERS. * configure: Regenerate. From-SVN: r139963
-
John David Anglin authored
PR testsuite/37325 * config/pa/pa64-hpux.h (ASM_OUTPUT_EXTERNAL_REAL): Call default_elf_asm_output_external. From-SVN: r139962
-