Skip to content
Snippets Groups Projects
  1. Sep 05, 2008
  2. Sep 04, 2008
    • Vladimir Makarov's avatar
      ira-conflicts.c (process_regs_for_copy): Check insn to check that the cost is... · 4cda38d5
      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
      4cda38d5
    • Samuel Tardieu's avatar
      re PR other/32783 (gcc-4_3-trunk/libiberty/configure - for ac_func... · 2f3b0d4a
      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
      2f3b0d4a
    • Jonathan Wakely's avatar
      re PR libstdc++/36962 ([C++0x] Add constructors / assignment operators from... · 640cbe76
      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
      640cbe76
    • Adam Nemet's avatar
      mips.h (ISA_HAS_SEQ_SNE): New macro. · 5299815b
      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
      5299815b
    • Adam Nemet's avatar
      mips.h (ISA_HAS_EXTS): New macro. · c8424132
      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
      c8424132
    • Adam Nemet's avatar
      mips.h (ISA_HAS_CINS): New macro. · 49912bcd
      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
      49912bcd
    • Le-Chun Wu's avatar
      Add myself to MAINTAINERS file under "Write After Approval". · 192a671e
      Le-Chun Wu authored
      From-SVN: r140005
      192a671e
    • Jonathan Wakely's avatar
      * doc/xml/manual/locale.xml: Fix typo. · 2442947e
      Jonathan Wakely authored
      From-SVN: r140003
      2442947e
    • Richard Guenther's avatar
      trans-array.c (gfc_conv_array_parameter): Use correct types in building COND_EXPRs. · 6e1b67b3
      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
      6e1b67b3
    • Bernd Schmidt's avatar
      bfin.c (gen_one_bundle): Don't create new nops when optimizing for size. · a524985e
      Bernd Schmidt authored
      	* config/bfin/bfin.c (gen_one_bundle): Don't create new nops when
      	optimizing for size.
      
      From-SVN: r139999
      a524985e
    • Richard Sandiford's avatar
      df-scan.c (df_get_entry_block_def_set): Add STACK_POINTER_REGNUM regardless of epilogue_completed. · 1d489435
      Richard Sandiford authored
      gcc/
      	* df-scan.c (df_get_entry_block_def_set): Add STACK_POINTER_REGNUM
      	regardless of epilogue_completed.
      
      From-SVN: r139998
      1d489435
    • Daniel Kraft's avatar
      re PR fortran/37099 (Wrong results when comparing a character array to a character expression) · d5551618
      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
      d5551618
    • Vladimir Makarov's avatar
      re PR middle-end/37359 (IRA miscompiled transfer.o in libgfortran, sejmp) · 5feec5c1
      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
      5feec5c1
    • Paolo Carlini's avatar
      acinclude.m4 ([GLIBCXX_CHECK_GTHREADS]): Tidy checks in case of POSIX threads. · a1c5742d
      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
      a1c5742d
    • Richard Sandiford's avatar
      re PR middle-end/37243 (IRA causes wrong code generation) · acb37d29
      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
      acb37d29
    • Ian Lance Taylor's avatar
      rtl.h (LABEL_REF_NONLOCAL_P): Don't check for REG_LABEL_OPERAND or REG_LABEL_TARGET. · e0c68ce9
      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
      e0c68ce9
    • Paul Brook's avatar
      arm.c (arm_size_rtx_costs): Call cost function. · 71062f1e
      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
      71062f1e
    • Bernd Schmidt's avatar
      bfin.c (bfin_function_ok_for_sibcall): Restore a null pointer check lost in... · d8612738
      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
      d8612738
    • H.J. Lu's avatar
      re PR middle-end/37243 (IRA causes wrong code generation) · 04888e68
      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
      04888e68
    • Chris Fairles's avatar
      mutex (once_flag): Construct __gthread_once_t in a temporary variable before... · d74eef3b
      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
      d74eef3b
    • Jan Hubicka's avatar
      re PR middle-end/37343 (ICE in expand_expr_real_1, at expr.c:7290) · d7f2fbf6
      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
      d7f2fbf6
    • Ira Rosen's avatar
      slp-perm-1.c: Add call to check_vect. · 0af0e8dc
      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
      0af0e8dc
    • Jan Hubicka's avatar
      tree-vrp.c (vrp_evaluate_conditional_warnv_with_ops_using_ranges): Break out from ... · 6b99f156
      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
      6b99f156
    • Jan Hubicka's avatar
      re PR tree-optimization/37345 (Segfault in decl_function_context (TYPE_MAIN_VARIANT)) · 4db15d75
      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
      4db15d75
    • Nick Clifton's avatar
      configure.ac (HAVE_GAS_LCOMM_WITH_ALIGNMENT): New assembler check. · 28e6bb13
      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
      28e6bb13
    • Kai Tietz's avatar
      t-mingw32 (SHLIB_LC): Change order of import libraries. · 48253184
      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
      48253184
    • Sebastian Pop's avatar
      configure.ac (--with-cloog-polylib): New. · d789184e
      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
      d789184e
    • Tobias Grosser's avatar
      2008-09-03 Tobias Grosser <grosser@fim.uni-passau.de> · 0da366c7
      Tobias Grosser authored
      	* gcc/testsuite/lib/target-supports.exp
      	(check_effective_target_fgraphite): Fix test. Graphite is only available
      	with -O1.
      
      From-SVN: r139970
      0da366c7
    • David Edelsohn's avatar
      [multiple changes] · 0783d48d
      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
      0783d48d
    • Paolo Carlini's avatar
      gnu.ver: Also export __once_functor_lock... · 37383ef5
      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
      37383ef5
    • GCC Administrator's avatar
      Daily bump. · 28545939
      GCC Administrator authored
      From-SVN: r139966
      28545939
  3. Sep 03, 2008
Loading