Skip to content
Snippets Groups Projects
  1. May 17, 2006
  2. May 16, 2006
    • Tom Tromey's avatar
      verify-impl.c (verify_instructions_0): Special case for Object.<init>. · 6420fb77
      Tom Tromey authored
      	* verify-impl.c (verify_instructions_0) <op_return>: Special case
      	for Object.<init>.
      
      From-SVN: r113830
      6420fb77
    • H.J. Lu's avatar
      options.texi: Move the Negative option. · 48b06e94
      H.J. Lu authored
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* doc/options.texi: Move the Negative option.
      
      From-SVN: r113827
      48b06e94
    • Richard Guenther's avatar
      re PR tree-optimization/22303 (CCP does not handle STRING_CSTs) · faaf1436
      Richard Guenther authored
      2006-05-16  Richard Guenther  <rguenther@suse.de>
      
      	PR tree-optimization/22303
      	* tree-ssa-ccp.c (fold_const_aggregate_ref): Handle reads
      	from STRING_CSTs.
      	(evaluate_stmt): Fall back to fold_const_aggregate_ref, if
      	ccp_fold did not simplify the statement.
      
      	* gcc.dg/tree-ssa/ssa-ccp-13.c: New testcase.
      
      From-SVN: r113826
      faaf1436
    • H.J. Lu's avatar
      re PR target/26885 (-m64 -m32 no longer creates 32-bit object) · 14c7833c
      H.J. Lu authored
      gcc/
      
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR driver/26885
      	* Makefile.in (GCC_OBJS): New.
      	(OBJS-common): Add opts-common.o.
      	(xgcc$(exeext)): Replace gcc.o with $(GCC_OBJS).
      	(cpp$(exeext)): Likewise.
      	(gcc.o): Also depend on opts.h.
      	(opts-common.o): New.
      
      	* common.opt (gcoff): Add Negative(gdwarf-2).
      	(gdwarf-2): Add Negative(gstabs).
      	(gstabs): Add Negative(gstabs+).
      	(gstabs+): Add Negative(gvms).
      	(gvms): Add Negative(gxcoff).
      	(gxcoff): Add Negative(gxcoff+).
      	(gxcoff+): Add Negative(gcoff).
      	* config/i386/i386.opt (m32): Add Negative(m64).
      	(m64): Add Negative(m32).
      
      	* doc/options.texi: Document the Negative option.
      
      	* gcc.c: Include "opts.h".
      	(main): Call prune_options after expandargv.
      
      	* optc-gen.awk: Generate common declarations for all flag
      	variables in options.c. Output the neg_index field.
      
      	* opts.c (find_opt): Moved to ...
      	* opts-common.c: Here. New file.
      
      	* opts.h (cl_option): Add a neg_index field.
      	(find_opt): New.
      	(prune_options): Likewise.
      
      gcc/cp/
      
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR driver/26885
      	* Make-lang.in (GXX_OBJS): Replace gcc.o with $(GCC_OBJS).
      
      gcc/fortran/
      
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR driver/26885
      	* Make-lang.in (GFORTRAN_D_OBJS): Replace gcc.o with
      	$(GCC_OBJS).
      
      gcc/java/
      
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR driver/26885
      	* Make-lang.in ($(GCJ)$(exeext)): Replace gcc.o with
      	$(GCC_OBJS).
      
      gcc/treelang/
      
      2006-05-16  H.J. Lu  <hongjiu.lu@intel.com>
      
      	PR driver/26885
      	* Make-lang.in (gtreelang$(exeext)): Replace gcc.o with
      	$(GCC_OBJS).
      
      From-SVN: r113824
      14c7833c
    • Jakub Jelinek's avatar
      re PR middle-end/27573 (ICE with -fopenmp -fprofile-generate) · b570947c
      Jakub Jelinek authored
      	PR middle-end/27573
      	* omp-low.c (expand_omp_parallel): Don't assert
      	.OMP_DATA_I = &.OMP_DATA_O is the first statement in the block,
      	instead search for it.
      
      	* gcc.dg/gomp/pr27573.c: New test.
      	* gfortran.dg/gomp/pr27573.f90: New test.
      
      From-SVN: r113823
      b570947c
    • Jakub Jelinek's avatar
      re PR c/27499 (ICE with unsigned iteration variable and -fopenmp) · 4156f84b
      Jakub Jelinek authored
      	PR c/27499
      	* gimplify.c (gimplify_omp_for): Remove assertion that iteration var
      	is signed.
      
      	* gcc.dg/gomp/pr27499.c: New test.
      	* g++.dg/gomp/pr27499.C: New test.
      
      From-SVN: r113822
      4156f84b
    • Andreas Schwab's avatar
      tm.texi (TARGET_LIBGCC_SDATA_SECTION): Add missing @end defmac. · 726e9992
      Andreas Schwab authored
      	* doc/tm.texi (TARGET_LIBGCC_SDATA_SECTION): Add missing @end
      	defmac.
      
      From-SVN: r113821
      726e9992
    • Mark Mitchell's avatar
      re PR c++/27339 (out-of-class definition of value template parameter with private type) · 6b648482
      Mark Mitchell authored
      	PR c++/27339
      	* cp-tree.h (perform_access_checks): New function.
      	* semantics.c (perform_access_checks): New function.
      	(perform_deferred_access_checks): Use it.
      	* parser.c (cp_parser_simple_declaration): Adjust call to
      	cp_parser_init_declarator.
      	(cp_parser_type_parameter): Do not defer checks in default
      	arguments.
      	(cp_parser_explicit_specialization): Adjust call to
      	cp_parser_single_declaration.
      	(cp_parser_init_declarator): Perform template-parameter access
      	checks. 
      	(cp_parser_parameter_declaration): Do not defer checks for
      	template parameter default arguments.
      	(cp_parser_template_declaration_after_export): Gather access
      	checks for template parameters, and pass them to
      	cp_parser_single_declaration.
      	(cp_parser_template_parameter_access_checks): New function.
      	(cp_parser_single_declaration): Add checks parameter.
      	PR c++/27339
      	* g++.dg/parser/access8.C: Adjust error marker.
      	* g++.dg/template/access17.C: New test.
      	* g++.dg/template/access18.C: Likewise.
      
      From-SVN: r113819
      6b648482
    • Roger Sayle's avatar
      re PR target/26600 (internal compiler error: in push_reload, at reload.c:1303) · d0b89852
      Roger Sayle authored
      	PR target/26600
      	* config/i386/i386.c (legitimate_constant_p) <CONST_DOUBLE>: TImode
      	integer constants other than zero are only legitimate on TARGET_64BIT.
      	<CONST_VECTOR> Only zero vectors are legitimate.
      	(ix86_cannot_force_const_mem): Integral and vector constants can
      	always be put in the constant pool.
      
      	* gcc.target/i386/pr26600.c: New test case.
      
      From-SVN: r113818
      d0b89852
    • DJ Delorie's avatar
      crtstuff.c (__dso_handle): Set section from TARGET_LBIGCC_SDATA_SECTION if defined. · a0cfeb0f
      DJ Delorie authored
      * crtstuff.c (__dso_handle): Set section from
      TARGET_LBIGCC_SDATA_SECTION if defined.
      * doc/tm.text (TARGET_LIBGCC_SDATA_SECTION): Document.
      * config/mips/mips.h (TARGET_LIBGCC_SDATA_SECTION): Define.
      
      From-SVN: r113817
      a0cfeb0f
    • Danny Smith's avatar
      re PR target/27599 (build failure on mingw) · 21028020
      Danny Smith authored
              PR target/27599
      	* config.host (i[34567]86-*-mingw*): Append i386/x-mingw32 to
      	host_xmake_file.
      
      From-SVN: r113816
      21028020
    • Ben Elliston's avatar
      * tree-cfg.c (split_edge_bb_loc): Remove unused variable `src'. · 4741d956
      Ben Elliston authored
      From-SVN: r113811
      4741d956
    • GCC Administrator's avatar
      Daily bump. · 58408a4c
      GCC Administrator authored
      From-SVN: r113808
      58408a4c
  3. May 15, 2006
    • Per Bothner's avatar
      tree.c: (last_annotated_node): Use sources_locus typedef. · 44422aa3
      Per Bothner authored
      	* tree.c: (last_annotated_node): Use sources_locus typedef.
      	This permits bootstrapping with --enable-mapped-location.
      
      From-SVN: r113804
      44422aa3
    • Mark Mitchell's avatar
      re PR c++/27505 (ICE in const folding with bitfields) · e1039697
      Mark Mitchell authored
      	PR c++/27505
      	* call.c (convert_like_real): Convert bitfields to their declared
      	types when forming an rvalue.
      	* tree.c (convert_bitfield_to_declared_type): New function.
      	(rvalue): Use it.
      	* cp-tree.h (convert_bitfield_to_declare_type): Declare it.
      	PR c++/27505
      	* g++.dg/expr/bitfield1.C: New test.
      
      From-SVN: r113803
      e1039697
    • Andreas Tobler's avatar
      Fix typo in the last commit. Sorry. · 34a660ec
      Andreas Tobler authored
      From-SVN: r113802
      34a660ec
    • Andreas Tobler's avatar
      stacktrace.cc (StackTrace::FillInFrameInfo): Use UNWRAP_FUNCTION_DESCRIPTOR to... · eb55476b
      Andreas Tobler authored
      stacktrace.cc (StackTrace::FillInFrameInfo): Use UNWRAP_FUNCTION_DESCRIPTOR to compare frame->start_ip against the...
      
      2006-05-15  Andreas Tobler  <a.tobler@schweiz.ch>
      
      	* stacktrace.cc (StackTrace::FillInFrameInfo): Use
      	UNWRAP_FUNCTION_DESCRIPTOR to compare frame->start_ip against the
      	klass->methods[j].ncode.
      
      From-SVN: r113801
      eb55476b
    • Paolo Carlini's avatar
      hashtable (hashtable<>::m_find, [...]): Add. · f99b2be1
      Paolo Carlini authored
      2006-05-15  Paolo Carlini  <pcarlini@suse.de>
      
      	* include/tr1/hashtable (hashtable<>::m_find, m_insert_bucket): Add.
      	(hashtable<>::find, m_insert(const value_type&, std::tr1::true_type),
      	map_base<>::operator[]): Use the above.
      	* testsuite/performance/23_containers/insert/unordered_map_array.cc:
      	New.	
      
      	* include/tr1/hashtable (hashtable<>::find_node,
      	insert(const value_type&, ...), erase_node): Rename to m_*, adjust
      	callers.
      	* include/tr1/hashtable: Minor cosmetic changes.
      
      From-SVN: r113800
      f99b2be1
    • Zdenek Dvorak's avatar
      re PR tree-optimization/26830 (Repeated SSA update during loop header copying) · 95dd3097
      Zdenek Dvorak authored
      	PR tree-optimization/26830
      	* tree-into-ssa.c (struct ssa_name_info): Add age field.
      	(info_for_ssa_name, current_info_for_ssa_name_age,
      	blocks_to_update): New variables.
      	(get_ssa_name_ann): Use info_for_ssa_name instead of SSA_NAME_AUX.
      	(clear_ssa_name_info, initialize_flags_in_bb,
      	mark_block_for_update): New functions.
      	(mark_def_sites, rewrite_stmt): Assert that blocks_to_update is NULL.
      	(insert_phi_nodes_for, mark_use_interesting, prepare_block_for_update,
      	prepare_def_site_for): Use mark_block_for_update.
      	(mark_def_interesting): Assert that the processed block is marked in
      	blocks_to_update.  Do not take blocks argument.
      	(prepare_use_sites_for, prepare_names_to_update): Do not take blocks
      	argument.
      	(rewrite_update_init_block, rewrite_update_stmt): Only process
      	blocks with statements to rewrite.
      	(delete_update_ssa): Do not clear SSA_NAME_AUX.
      	(update_ssa): Initialize and free blocks_to_update.  Do not
      	clear flags on statements.  Do not use blocks bitmap.
      	* tree.h (SSA_NAME_AUX): Removed.
      	(struct tree_ssa_name): Removed aux field.
      	* print-tree.c (print_node): Do not print SSA_NAME_AUX.
      
      From-SVN: r113799
      95dd3097
    • Zdenek Dvorak's avatar
      Fix spacing. · f8f80cbb
      Zdenek Dvorak authored
      From-SVN: r113798
      f8f80cbb
    • Richard Guenther's avatar
      re PR tree-optimization/27603 (wrong code, apparently due to bad VRP (-O2)) · 7136db7a
      Richard Guenther authored
      2006-05-15  Richard Guenther  <rguenther@suse.de>
      
      	PR tree-optimization/27603
      	* tree-ssa-loop-niter.c (infer_loop_bounds_from_undefined):
      	Do computations in original type.
      
      	* gcc.dg/torture/pr27603.c: New testcase.
      
      From-SVN: r113797
      7136db7a
    • Paul Thomas's avatar
      re PR fortran/25090 (Bad automatic character length) · b6398823
      Paul Thomas authored
      2006-05-15  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/25090
      	* resolve.c: Static resolving_index_expr initialized.
      	(entry_parameter): New function to emit errors for variables
      	that are not entry parameters.
      	(gfc_resolve_expr): Call entry_parameter, when resolving
      	variables, if the namespace has entries and resolving_index_expr
      	is set.
      	(resolve_charlen): Set resolving_index_expr before the call to
      	resolve_index_expr and reset it afterwards.
      	(resolve_fl_variable): The same before and after the call to
      	is_non_constant_shape_array, which ultimately makes a call to
      	gfc_resolve_expr.
      
      	PR fortran/25082
      	* resolve.c (resolve_code): Add error condition that the return
      	expression must be scalar.
      
      	PR fortran/24711
      	* matchexp.c (gfc_get_parentheses): New function.
      	(match_primary): Remove inline code and call above.
      	* gfortran.h: Provide prototype for gfc_get_parentheses.
      	* resolve.c (resolve_array_ref): Call the above, when start is a
      	derived type variable array reference.
      
      2006-05-15  Paul Thomas  <pault@gcc.gnu.org>
      
      	PR fortran/25090
      	* gfortran.dg/entry_dummy_ref_1.f90: New test.
      
      	PR fortran/25082
      	* gfortran.dg/scalar_return_1.f90: New test.
      
      	PR fortran/24711
      	* gfortran.dg/derived_comp_array_ref_1.f90: New test.
      
      From-SVN: r113796
      b6398823
    • Mircea Namolaru's avatar
      see.c: Code style changes such as redundant paranthesis... · a0145633
      Mircea Namolaru authored
      2006-05-15  Mircea Namolaru  <namolaru@il.ibm.com>
      
              * see.c: Code style changes such as redundant paranthesis,
              redundant intialization of local variables etc.
              (see_main): Declared now as static.
              * doc/invoke.texi: Update that -fsee is not enabled by
              default at -O3.
      
      From-SVN: r113792
      a0145633
    • Jakub Jelinek's avatar
      omp-low.c (check_omp_nesting_restrictions): New function. · a6fc8e21
      Jakub Jelinek authored
      	* omp-low.c (check_omp_nesting_restrictions): New function.
      	(scan_omp_1): Call it.
      
      	* gcc.dg/gomp/critical-4.c: New test.
      	* gcc.dg/gomp/appendix-a/a.35.1.c: Add dg-warning.
      	* gcc.dg/gomp/appendix-a/a.35.3.c: Likewise.
      	* gfortran.dg/gomp/appendix-a/a.35.1.f90: Likewise.
      	* gfortran.dg/gomp/appendix-a/a.35.3.f90: Likewise.
      
      From-SVN: r113790
      a6fc8e21
    • Jakub Jelinek's avatar
      re PR middle-end/27416 (ICE on invalid firstprivate/lastprivate) · eeb1d9e0
      Jakub Jelinek authored
      	PR middle-end/27416
      	* omp-low.c (build_outer_var_ref): If VAR is reference in orphaned
      	construct, return *VAR.
      
      	* libgomp.fortran/pr27416-1.f90: New test.
      
      From-SVN: r113788
      eeb1d9e0
    • Jakub Jelinek's avatar
      re PR fortran/27446 (ICE on OpenMP array REDUCTION clause) · 5b8fdd1f
      Jakub Jelinek authored
      	PR fortran/27446
      	* trans-openmp.c (gfc_trans_omp_array_reduction): Ensure
      	OMP_CLAUSE_REDUCTION_{INIT,MERGE} are set to BIND_EXPR.
      
      From-SVN: r113787
      5b8fdd1f
    • Volker Reichelt's avatar
      re PR c++/27582 (ICE with invalid template parameter) · 7e497d0c
      Volker Reichelt authored
      	PR c++/27582
      	* pt.c (any_dependent_template_arguments_p): Return early on invalid
      	argument list.
      
      	* g++.dg/template/dependent-args1.C: New test.
      
      From-SVN: r113784
      7e497d0c
    • Volker Reichelt's avatar
      re PR c++/27581 (ICE using this-pointer in static member function) · 0616700c
      Volker Reichelt authored
      	PR c++/27581
      	* search.c (adjust_result_of_qualified_name_lookup): Skip on
      	invalid context_class.
      
      	* g++.dg/lookup/this1.C: New test.
      
      From-SVN: r113781
      0616700c
    • Volker Reichelt's avatar
      re PR c++/27315 (ICE with ill-placed expression) · ad47b891
      Volker Reichelt authored
      	PR c++/27315
      	* pt.c (do_decl_instantiation): Return early on invalid decl.
      
      	* g++.dg/template/operator6.C: New test.
      	* g++.dg/template/incomplete3.C: New test.
      
      From-SVN: r113778
      ad47b891
    • Volker Reichelt's avatar
      re PR c++/27559 (ICE on templated operator new) · 7c60008e
      Volker Reichelt authored
      	PR c++/27559
      	* pt.c (push_template_decl_real): Return error_mark_node instead
      	of broken decl.
      
      	* g++.dg/template/new4.C: New test.
      
      From-SVN: r113777
      7c60008e
    • Volker Reichelt's avatar
      re PR c++/27496 (ICE on broken templated friend) · dca56f77
      Volker Reichelt authored
      	PR c++/27496
      	* pt.c (tsubst_friend_class): Return early on invalid friend
      	declarations.
      
      	* g++.dg/template/void2.C: New test.
      
      From-SVN: r113776
      dca56f77
    • H.J. Lu's avatar
      Make-lang.in (ada/decl.o): Replace target.h with $(TARGET_H). · 05b44921
      H.J. Lu authored
      gcc/ada/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (ada/decl.o): Replace target.h with $(TARGET_H).
      	(ada/misc.o): Likewise.
      	(ada/utils.o): Likewise.
      
      gcc/cp/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (cp/decl.o): Add dependency on $(TARGET_H).
      	(cp/decl2.o): Likewise.
      	(cp/typeck.o): Likewise.
      	(cp/cvt.o): Likewise.
      	(cp/parser.o): Likewise.
      	(cp/call.o): Replace target.h with $(TARGET_H).
      
      gcc/fortran/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (fortran/options.o): Depend on $(TARGET_H).
      
      gcc/java/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (java/decl.o): Add dependency on $(TARGET_H).
      	(java/expr.o): Replace target.h with $(TARGET_H).
      	(java/parse.o): Likewise.
      
      gcc/objcp/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (objcp/objcp-decl.o): Add dependency on
      	$(TARGET_H).
      
      gcc/treelang/
      
      2006-05-14  H.J. Lu  <hongjiu.lu@intel.com>
      
      	* Make-lang.in (treelang/treetree.o): Add dependency on
      	$(TARGET_H).
      
      From-SVN: r113773
      05b44921
    • GCC Administrator's avatar
      Daily bump. · eaebb9cb
      GCC Administrator authored
      From-SVN: r113770
      eaebb9cb
  4. May 14, 2006
Loading