Skip to content
Snippets Groups Projects
  1. Sep 17, 2004
  2. Sep 16, 2004
    • Kaz Kojima's avatar
      sh.md (call): Extend 32-bit addresses to DImode for 32-bit TARGET_SHMEDIA. · e57450ce
      Kaz Kojima authored
      	* config/sh/sh.md (call): Extend 32-bit addresses to DImode
      	for 32-bit TARGET_SHMEDIA.
      	(call_value): Likewise.
      
      From-SVN: r87619
      e57450ce
    • Mark Mitchell's avatar
      re PR c++/17501 (Confusion with member templates) · 67bcc252
      Mark Mitchell authored
      	PR c++/17501
      	* parser.c (cp_parser_nested_name_specifier): Do not resolve
      	typename types if the user explicitly said "typename".
      
      	PR c++/17501
      	* g++.dg/template/typename7.C: New test.
      
      From-SVN: r87616
      67bcc252
    • Diego Novillo's avatar
      tree-ssa-operands.c (add_call_clobber_ops): Make read-only test apply only to... · 1800536a
      Diego Novillo authored
      tree-ssa-operands.c (add_call_clobber_ops): Make read-only test apply only to TREE_STATIC and DECL_EXTERNAL.
      
      
      	* tree-ssa-operands.c (add_call_clobber_ops): Make read-only
      	test apply only to TREE_STATIC and DECL_EXTERNAL.
      
      From-SVN: r87615
      1800536a
    • Zdenek Dvorak's avatar
      Makefile.in (tree-cfg.o): Add CFGLAYOUT_H dependency. · 42759f1e
      Zdenek Dvorak authored
      	* Makefile.in (tree-cfg.o): Add CFGLAYOUT_H dependency.
      	* basic-block.h (get_dominated_by_region): Declare.
      	* dominance.c (get_dominated_by_region): New function.
      	* tree-cfg.c: Include cfglayout.h.
      	(tree_duplicate_bb): Duplicate also phi nodes.
      	(struct ssa_name_map_entry): New type.
      	(add_phi_args_after_copy_bb, add_phi_args_after_copy,
      	ssa_name_map_entry_hash, ssa_name_map_entry_eq,
      	allocate_ssa_names, rewrite_to_new_ssa_names_def,
      	rewrite_to_new_ssa_names_use, rewrite_to_new_ssa_names_bb,
      	rewrite_to_new_ssa_names, tree_duplicate_sese_region): New functions.
      	* tree-flow.h (tree_duplicate_sese_region, add_phi_args_after_copy_bb,
      	add_phi_args_after_copy, rewrite_to_new_ssa_names_bb,
      	rewrite_to_new_ssa_names, allocate_ssa_names,
      	rewrite_into_loop_closed_ssa, verify_loop_closed_ssa): Declare.
      	* tree-ssa-loop-ch.c (duplicate_blocks): Removed.
      	(copy_loop_headers): Use tree_duplicate_sese_region.
      
      	* gcc.dg/tree-ssa/copy-headers.c: Update outcome.
      
      From-SVN: r87614
      42759f1e
    • Frank Ch. Eigler's avatar
      profile.c (branch_prob): Restore support for USE_MAPPED_LOCATION. · 2731cf24
      Frank Ch. Eigler authored
      2004-09-16  Frank Ch. Eigler  <fche@redhat.com>
      
      	* profile.c (branch_prob): Restore support for USE_MAPPED_LOCATION.
      
      From-SVN: r87613
      2731cf24
    • Frank Ch. Eigler's avatar
      bprob.exp, bprob.exp: Iterate tests with -ftree-based-profiling also. · 8304ad70
      Frank Ch. Eigler authored
      2004-09-16  Frank Ch. Eigler  <fche@redhat.com>
      
      	* gcc.misc-tests/bprob.exp, g++.dg/bprob/bprob.exp: Iterate tests
      	with -ftree-based-profiling also.
      	* lib/profopt.exp: Support late-set profile_option/feedback_option.
      
      From-SVN: r87612
      8304ad70
    • Jeff Law's avatar
      tree-into-ssa.c (block_defs_stack): New toplevel varray. · 9fae925b
      Jeff Law authored
      	* tree-into-ssa.c (block_defs_stack): New toplevel varray.
      	(rewrite_block_data): Remove, no longer used.
      	(rewrite_initialize_block_local_data): Remove, no longer used.
      	(rewrite_initialize_block): Mark parameters as unused as needed.
      	Change references to the block local block_defs to be block_defs_stack.
      	Push a marker onto the block_defs_stack.
      	(ssa_rewrite_initialize_block): Similarly.
      	(rewrite_stmt, ssa_rewrite_stmt): Similarly.
      	(ssa_register_new_def): No longer needs varray argument.  Use
      	block_defs_stack instead.  No longer handle possibly null block_defs
      	varray.  Reverse order of items we push on the stack to make it
      	easier to identify our marker.
      	(register_new_def): No longer handle possibly null block_defs
      	varray.
      	(rewrite_finalize_block): Revamp to look for markers in the global
      	block_defs_stack varray rather than wiping a block local varray.
      	Mark arguments as unused as needed.
      	(ssa_rewrite_finalize_block): Similarly.
      	(rewrite_into_ssa): Update initialization of dom walker structure
      	to reflect that we don't need block local data anymore.  Initialize
      	the block_defs_stack varray.
      	(rewrite_ssa_into_ssa): Similarly.
      	* tree-ssa-dom.c (block_defs_stack): New toplevel varray.
      	(struct dom_walk_data): Kill block_defs field.
      	(tree_ssa_dominator_optimize): Initialize block_defs_stack.
      	(thread_across_edge): Use the global block_defs_stack instead of
      	the old block_defs varray.
      	(dom_opt_initialize_block_local_data): Update now that we don't have
      	block_defs field to check anymore.
      	(dom_opt_initialize_block): Push a marker onto block_defs_stack.
      	(restore_currdefs_to_original_value): Use the new block_defs_stack
      	instead of a block local varray.
      	(dom_opt_finalize_block): Similarly.
      	(record_equivalencs_from_phis): Similarly.
      	(optimize_stmt, register_definitions_for_stmt): Similarly.
      
      From-SVN: r87611
      9fae925b
    • Andrew MacLeod's avatar
      error.c (dump_decl): Make sure there is lang_specific info before checking for DTOR and CTOR decls. · 2d0db225
      Andrew MacLeod authored
      2004-09-16  Andrew MacLeod  <amacleod@redhat.com>
      
      	* error.c (dump_decl): Make sure there is lang_specific info before
      	checking for DTOR and CTOR decls.
      
      From-SVN: r87610
      2d0db225
    • Andrew MacLeod's avatar
      re PR tree-optimization/17517 (ICE: SSA corruption) · 49f48e9f
      Andrew MacLeod authored
      2004-09-16  Andrew MacLeod  <amacleod@redhat.com>
      
      	PR tree-optimization/17517
      	* tree-ssa-copyrename.c (copy_rename_partition_coalesce): Don't
      	coalesce same-root variables without checking for abnormal PHI usage.
      
      From-SVN: r87609
      49f48e9f
    • Daniel Berlin's avatar
      [multiple changes] · f67d92e9
      Daniel Berlin authored
      2004-09-16  Daniel Berlin  <dberlin@dberlin.org>
      
      	* cfgloop.h (duplicate_loop):  Add prototype.
      	* cfgloopmanip.c (duplicate_loop): Make non-static.
      	* lambda-code.c (perfect_nestify): Factor out test whether
      	we can handle this loop into separate function.
      	Call it.
      	(can_convert_to_perfect_nest): New function.
      	(replace_uses_of_x_with_y): Add modify_stmt call.
      	* tree-loop-linear.c (linear_transform_loops): Call
      	rewrite_into_loop_closed_ssa and free_df.
      
      2004-09-16  Daniel Berlin  <dberlin@dberlin.org>
      
      	* lambda-code.c (invariant_in_loop): is_gimple_min_invariant is
      	loop invariant as well.
      	(perfect_nestify): new function.
      	(gcc_loop_to_lambda_loop): New parameters to track lower bounds,
      	upper bounds, and steps.
      	Set outerinductionvar properly.
      	(gcc_loopnest_to_lambda_loopnest): Add loops and need_perfect
      	parameters.
      	Return NULL if we need a perfect loop and can't make one.
      	(lambda_loopnest_to_gcc_loopnest): Correct algorithm.
      	(not_interesting_stmt): New function.
      	(phi_loop_edge_uses_def): Ditto.
      	(stmt_uses_phi_result): Ditto.
      	(stmt_is_bumper_for_loop): Ditto.
      	(perfect_nest_p): Ditto.
      	(nestify_update_pending_stmts): Ditto.
      	(replace_uses_of_x_with_y): Ditto.
      	(stmt_uses_op): Ditto.
      	(perfect_nestify): Ditto.
      	* lambda-mat.c (lambda_matrix_id_p): New function.
      	* lambda-trans.c (lambda_trans_matrix_id_p): Ditto.
      	* lambda.h: Update prototypes.
      	* tree-loop-linear (linear_transform_loop): Use new
      	perfect_nest_p. Detect and ignore identity transform.
      	* tree-ssa-loop.c (pass_linear_transform): Use TODO_write_loop_closed.
      
      2004-09-16  Sebastian Pop  <pop@cri.ensmp.fr>
      
      	* tree-loop-linear.c (gather_interchange_stats): Add more comments.
      	Gather also strides of accessed data.  Pass in the data references
      	array.
      	(try_interchange_loops): Add a new heuristic for handling the temporal
      	locality.  Pass in the data references array.
      	(linear_transform_loops): Pass the data references array to
      	try_interchange_loops.
      
      From-SVN: r87607
      f67d92e9
    • Kazu Hirata's avatar
      * doc/invoke.texi: Fix typos. Follow spelling conventions. · 83c99486
      Kazu Hirata authored
      From-SVN: r87606
      83c99486
    • Kazu Hirata's avatar
      array.c, [...]: Fix comment typos. · 1f2959f0
      Kazu Hirata authored
      	* array.c, data.c, decl.c, dependency.c, error.c, f95-lang.c,
      	interface.c, intrinsic.c, io.c, misc.c, module.c, parse.h,
      	resolve.c, scanner.c, trans-array.c, trans-array.h,
      	trans-common.c, trans-const.h, trans-decl.c, trans-expr.c,
      	trans-intrinsic.c, trans-stmt.c, trans-types.c, trans.c,
      	trans.h: Fix comment typos.  Follow spelling conventions.
      
      From-SVN: r87605
      1f2959f0
    • Nathan Sidwell's avatar
      class.c (copy_virtuals): Remove. · d1f05f93
      Nathan Sidwell authored
      	* class.c (copy_virtuals): Remove.
      	(build_primary_vtable): Use copy_list directly.
      	(build_secondary_vtable): Likewise.
      	(update_vtable_entry_for_fn): Clear BV_CALL_INDEX here.
      	(create_vtable_ptr): Likewise.
      
      From-SVN: r87604
      d1f05f93
Loading