Skip to content
Snippets Groups Projects
  1. Sep 20, 2004
  2. Sep 19, 2004
    • Mark Mitchell's avatar
      decl2.c (determine_visibility): Allow class visibility directives to override... · 5bd91632
      Mark Mitchell authored
      decl2.c (determine_visibility): Allow class visibility directives to override targetm.cxx.export_class_data.
      
      	* decl2.c (determine_visibility): Allow class visibility
      	directives to override targetm.cxx.export_class_data.
      
      [[Split portion of a mixed commit.]]
      
      From-SVN: r87735.2
      5bd91632
    • Ira Rosen's avatar
      tree-vectorizer.h (stmt_vec_info): Add vect_dr_base field. · 6775f1f3
      Ira Rosen authored
      2004-09-19  Ira Rosen  <irar@il.ibm.com>
      
              * tree-vectorizer.h (stmt_vec_info): Add vect_dr_base field.
              (STMT_VINFO_VECT_DR_BASE): Declare.
              (VECT_SMODULO): Declare.
              * tree-vectorizer.c (vect_compute_array_ref_alignment): New function.
              (vect_compute_array_base_alignment): New function.
              (vect_analyze_data_ref_access): Check array indices. Remove one
              dimensional arrays restriction.
              (vect_get_ptr_offset): New function.
              (vect_get_symbl_and_dr): New function.
              (vect_get_base_and_bit_offset): Support additional data refs. Renamed
              (former name vect_get_base_decl_and_bit_offset).
              (vect_create_index_for_array_ref): Removed.
              (vect_create_index_for_vector_ref): New function.
              (vect_create_addr_base_for_vector_ref): New function.
              (vect_create_data_ref): Handle additional data refs. Call
              vect_create_index_for_vector_ref and vect_create_addr_base_for_vector_ref.
              (vect_compute_data_ref_alignment): Support the changes. Call
              vect_get_base_and_bit_offset.
              (vect_analyze_data_refs): Call vect_get_symbl_and_dr. Support additional
              data refs. Store vect_dr_base.
              (vect_analyze_data_ref_accesses): Support nonconstant init.
              (new_stmt_vec_info): Initialize vect_dr_base field.
              (vect_is_simple_iv_evolution): Call initial_condition_in_loop_num.
              (get_vectype_for_scalar_type): Check for BLKmode.
              * tree-chrec.h (initial_condition_in_loop_num): Declare.
              * tree-chrec.c (initial_condition_in_loop_num): New function.
              (chrec_component_in_loop_num): New function.
              (evolution_part_in_loop_num): Call chrec_component_in_loop_num.
              * tree-data-ref.c (analyze_array_indexes): Change parameter (access_fns)
              to be pointer to varray_type.
      
      From-SVN: r87731
      6775f1f3
    • Jan Hubicka's avatar
      basic-block.h (update_bb_profile_after_threading): Declare. · 15db5571
      Jan Hubicka authored
      	* basic-block.h (update_bb_profile_after_threading): Declare.
      	* cfg.c (update_bb_profile_after_threading): Break out from ...
      	* cfgcleanup.c (try_forward_edges): ... here; use it.
      	* tree-ssa-dom.c (thread_across_edge): Use it.
      	* tree-ssa-threadupdate.c (create_block_for_threading): Zero out
      	profile of the new BB.
      
      From-SVN: r87730
      15db5571
    • Daniel Berlin's avatar
      tree-ssa-pre.c (insert_into_set): Don't put is_gimple_min_invariant values into the set. · 97141338
      Daniel Berlin authored
      2004-09-19  Daniel Berlin  <dberlin@dberlin.org>
      
      	* tree-ssa-pre.c (insert_into_set): Don't put
      	is_gimple_min_invariant values into the set.
      
      From-SVN: r87725
      97141338
    • Andreas Jaeger's avatar
      tree-ssa-dom.c (restore_nonzero_vars_to_original_value): Fix prototype. · 76fd4fd7
      Andreas Jaeger authored
      	* tree-ssa-dom.c (restore_nonzero_vars_to_original_value): Fix
      	prototype.
      
      From-SVN: r87721
      76fd4fd7
    • Kazu Hirata's avatar
      cris.h: Preserve the original spelling in a quote. · 938688cd
      Kazu Hirata authored
      	* config/cris/cris.h: Preserve the original spelling in a
      	quote.
      
      From-SVN: r87720
      938688cd
    • Jeff Law's avatar
      tree-ssa-dom.c (nonzero_vars_stack, [...]): New global varrays to replace the block local varrays. · fdabe5c2
      Jeff Law authored
      	* tree-ssa-dom.c (nonzero_vars_stack, vrp_variables_stack): New
      	global varrays to replace the block local varrays.
      	(struct dom_walk_block_data): Remove, no longer used.
      	(get_eq_expr_value): No longer need to pass around pointers to local
      	varrays.  Callers updated.  Unused markers added to unused parameters.
      	(record_range, record_equivalences_from_stmt): Likewise.
      	(record_equivalences_from_incoming_edge): Likewise.
      	(record_var_is_nonzero): Likewise.  Update now that we have a
      	single global varray of SSA_NAMEs that need restoring.
      	(dom_opt_initialize_block_local_data): Kill, no longer used.
      	(tree_ssa_dominator_optimize): Initialize new global varrays.
      	Update callbacks in dominator walker structure.
      	(dom_opt_initialize_block): Add markers to NONZERO_VAR_STACK and
      	VRP_VARIABLES_STACK.
      	(restore_nonzero_vars_to_original_value): Update now that we have
      	a single global varray of SSA_NAMEs that need restoring.
      	(dom_opt_finalize_block): Similarly for VRP_VARIABLES_STACK.
      	Remove unused variables.
      	(optimize_stmt): Remove unused variable.
      
      From-SVN: r87719
      fdabe5c2
    • GCC Administrator's avatar
      Daily bump. · 45576477
      GCC Administrator authored
      From-SVN: r87717
      45576477
  3. Sep 18, 2004
  4. Sep 17, 2004
    • Roger Sayle's avatar
      inclhack.def (linux_ia64_ucontext): New fix. · fa71a5c3
      Roger Sayle authored
      	* inclhack.def (linux_ia64_ucontext): New fix.
      	* fixincl.x: Regenerate.
      	* tests/base/sys/ucontext.h: New file.
      
      From-SVN: r87677
      fa71a5c3
    • Andreas Schwab's avatar
      Makefile.in (gimple-low.o): Depend on $(EXPR_H). · 6e336333
      Andreas Schwab authored
      	* Makefile.in (gimple-low.o): Depend on $(EXPR_H).
      	(tree-vectorizer.o): Likewise.
      	(targhooks.o): Likewise.
      
      From-SVN: r87676
      6e336333
    • Jeffrey D. Oldham's avatar
      alias.c (find_base_decl): Remove unreachable case '3' block. · 6615c446
      Jeffrey D. Oldham authored
      2004-09-17  Jeffrey D. Oldham  <oldham@codesourcery.com>
      	    Zack Weinberg  <zack@codesourcery.com>
      
      	* alias.c (find_base_decl): Remove unreachable case '3' block.
      	* expr.c (safe_from_p): Abort if passed a type.
      	* tree-gimple.c (recalculate_side_effects): Abort if passed
      	anything other than an expression.
      	* tree-ssa-pre.c (phi_translate): Return expr immediately if
      	is_gimple_min_invariant is true for it.  Reorder cases for clarity.
      	Abort on un-handled tree classes.
      	(valid_in_set): Likewise.
      	* tree.c (tree_code_class_strings): New static data.
      
      	* tree.h (enum tree_code_class): New.
      	(tree_code_class_strings): Declare.
      	(TREE_CODE_CLASS_STRING, EXCEPTIONAL_CLASS_P, CONSTANT_CLASS_P)
      	(REFERENCE_CLASS_P, COMPARISON_CLASS_P, UNARY_CLASS_P, BINARY_CLASS_P)
      	(STATEMENT_CLASS_P, EXPRESSION_CLASS_P, IS_TYPE_OR_DECL_P): New macros.
      	(TYPE_P, DECL_P, IS_NON_TYPE_CODE_CLASS, IS_EXPR_CODE_CLASS)
      	(checking macros, EXPR_LOCATION, SET_EXPR_LOCATION, EXPR_LOCUS): Update.
      
      	* tree.def, c-common.def, objc/objc-tree.def: Use
      	tree_code_class enumeration constants instead of code letters.
      
      	* alias.c, builtins.c, c-common.c, c-format.c, c-lang.c, c-pragma.c
      	* c-typeck.c, cgraphunit.c, convert.c, dbxout.c, dwarf2out.c
      	* emit-rtl.c expr.c, fold-const.c, gimplify.c, lambda-code.c
      	* langhooks.c, langhooks.h, predict.c, print-tree.c, reload1.c, stmt.c
      	* tree-browser.c, tree-cfg.c, tree-chrec.c, tree-complex.c, tree-dfa.c
      	* tree-dump.c, tree-eh.c, tree-gimple.c, tree-inline.c, tree-nested.c
      	* tree-outof-ssa.c, tree-pretty-print.c, tree-sra.c, tree-ssa-ccp.c
      	* tree-ssa-dce.c, tree-ssa-dom.c, tree-ssa-forwprop.c, tree-ssa-live.c
      	* tree-ssa-loop-im.c, tree-ssa-loop-ivopts.c, tree-ssa-operands.c
      	* tree-ssa-phiopt.c, tree-ssa-pre.c, tree-ssa-propagate.c
      	* tree-ssa.c, tree-ssanames.c, tree-tailcall.c, tree.c, varasm.c
      	* config/sol2-c.c, config/arm/arm.c, config/i386/winnt.c
      	* config/pa/pa.c, config/pa/pa.h, config/sh/sh.c, objc/objc-lang.c
      	Update to match.
      
      	* LANGUAGES: Add note about change.
      
      ada:
      	* ada-tree.def: Use tree_code_class enumeration constants
      	instead of code letters.
      	* ada-tree.h, decl.c, misc.c, trans.c, utils.c, utils2.c:
      	Update for new tree-class enumeration constants.
      
      cp:
      	* cp-tree.def: Use tree_code_class enumeration constants
      	instead of code letters.
      	* call.c, class.c, cp-gimplify.c, cp-lang.c, cxx-pretty-print.c
      	* mangle.c, pt.c, semantics.c, tree.c, typeck.c:
      	Update for new tree-class enumeration constants.
      
      fortran:
      	* f95-lang.c, trans-expr.c, trans.c: Update for new tree-class
      	enumeration constants.
      
      java:
      	* java-tree.def: Use tree_code_class enumeration constants
      	instead of code letters.
      	* java-gimplify.c, jcf-write.c, lang.c, parse.y: Update for
      	new tree-class enumeration constants.
      
      treelang:
      	* treetree.c: Update for new tree-class enumeration constants.
      
      From-SVN: r87675
      6615c446
    • Kenneth Zadeck's avatar
      20040917-1.c: New test. · ade22982
      Kenneth Zadeck authored
      2004-09-17  Kenneth Zadeck  <Kenneth.Zadeck@NaturalBridge.com>
      
      	* gcc.c-torture/execute/20040917-1.c: New test.
      
      From-SVN: r87674
      ade22982
    • Diego Novillo's avatar
      re PR tree-optimization/17319 (-fno-tree-dce cause ICE) · 823f0809
      Diego Novillo authored
      	PR tree-optimization/17319
      	* tree-ssa-alias.c (compute_points_to_and_addr_escape): Also
      	examine pointers on the LHS of an assignment.
      	(collect_points_to_info_r): Handle RETURN_EXPR.
      
      testsuite/ChangeLog
      
      	PR tree-optimization/17319
      	* gcc.dg/pr17319.c: New test.
      
      From-SVN: r87673
      823f0809
    • Jeff Law's avatar
      tree-ssa-dom.c (const_and_copies_stack): New. · b5fefcf6
      Jeff Law authored
      	* tree-ssa-dom.c (const_and_copies_stack): New.
      	(dom_walk_block_data): Remove const_and_copies field.
      	(record_const_or_copy): No longer need to pass in varray_type *.
      	Use CONST_AND_COPIES_STACK rather than passed in block local stack.
      	Callers updated.
      	(record_equality): Similarly.
      	(restore_vars_to_original_value): Similarly.  Revamp to use new
      	single global stack rather than per-block stacks.
      	(tree_ssa_dominator_optimize): Initialize the CONST_AND_COPIES_STACK.
      	(thread_across_edge): Remove now unused parameters.
      	(dom_opt_initialize_block_local_data): No longer test the block
      	local CONST_AND_COPIES.
      	(dom_opt_initialize_block): Push a marker on CONST_AND_COPIES_STACK.
      
      From-SVN: r87670
      b5fefcf6
    • Jan Hubicka's avatar
      re PR tree-optimization/17509 (ICE in verify_cgraph_node) · 2c459e74
      Jan Hubicka authored
      	PR tree-optimization/17509
      	* tree-optimize.c (update_inlined_to_pointers): New function.
      	(tree_rest_of_compilation): Use it.
      
      From-SVN: r87669
      2c459e74
    • Devang Patel's avatar
      dbxout.c (get_lang_number): New. · 0456cbf6
      Devang Patel authored
             * dbxout.c (get_lang_number): New.
             (dbxout_init): Include lang number in N_SO  stab.
             * dbxout.h (N_SO_AS, N_SO_C, N_SO_ANSI_C, N_SO_CC, N_SO_FORTRAN,
             N_SO_PASCAL, N_SO_FORTRAN90, N_SO_OBJC, N_SO_OBJCPLUS): New #define.
      
      testsuite
             * gcc.dg/20040813-1.c: New test.
      
      From-SVN: r87663
      0456cbf6
    • Diego Novillo's avatar
      re PR tree-optimization/17273 (ICE in get_indirect_ref_operands) · 7eae8eb2
      Diego Novillo authored
      	PR tree-optimization/17273
      	* tree-ssa.c (replace_immediate_uses): Call fold_stmt if the
      	replacement is a constant.
      
      testsuite/ChangeLog
      
      	PR tree-optimization/17273
      	* gcc.c-torture/compile/pr17273.c: New test.
      
      From-SVN: r87662
      7eae8eb2
    • Joseph Myers's avatar
      c-tree.h (enum c_typespec_keyword): New. · 98c3a782
      Joseph Myers authored
      	* c-tree.h (enum c_typespec_keyword): New.
      	(struct c_declspecs): Adjust description of "type".  Remove
      	specbits, explicit_int_p and explicit_char_p.  Rename
      	typedef_signed_p to explicit_signed_p.  Add default_int_p, long_p,
      	short_p, signed_p, unsigned_p and complex_p.
      	(finish_declspecs): New.
      	* c-parse.in (datadef, datadecl, setspecs, decl, component_decl,
      	typename): Call finish_declspecs.
      	* c-decl.c (finish_declspecs): New.
      	(declspecs_add_type): Check for combinations which cannot occur in
      	valid specifier lists.  Update comments.
      	(shadow_tag_warned): Remove checks done in finish_declspecs.
      	Don't report useless type name if type defaulted to int.
      	(grokdeclarator): Remove checks and actions done in
      	finish_declspecs.  Don't allow for type being NULL.  Update for
      	datastructures changes.  Initialize decl_attr.
      	(build_null_declspecs, quals_from_declspecs): Update for
      	datastructures changes.
      
      testsuite:
      	* gcc.dg/declspec-4.c, gcc.dg/declspec-5.c, gcc.dg/declspec-6.c:
      	Update expected messages.
      	* gcc.dg/declspec-13.c: New test.
      
      From-SVN: r87660
      98c3a782
Loading