Skip to content
Snippets Groups Projects
  1. Sep 18, 2004
  2. 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
    • Sylvain Pion's avatar
      * doc/extend.texi: Fix duplicated word. · 254ea84c
      Sylvain Pion authored
      From-SVN: r87657
      254ea84c
    • Paul Brook's avatar
      gfortran.h (struct gfc_linebuf): Don't use C99 empty arrays. · 4cdf7223
      Paul Brook authored
      	* gfortran.h (struct gfc_linebuf): Don't use C99 empty arrays.
      	(gfc_linebuf_header_size): Define.
      	* scanner.c (load_file): Use it.
      
      From-SVN: r87655
      4cdf7223
    • Toon Moene's avatar
      invoke.texi: Remove stray explanation on -freduce-all-givs and -fmove-all-movables. · fa151acf
      Toon Moene authored
      2004-09-17  Toon Moene  <toon@moene.indiv.nluug.nl>
      
      	* doc/invoke.texi: Remove stray explanation on
      	-freduce-all-givs and -fmove-all-movables.
      
      From-SVN: r87651
      fa151acf
    • Jonathan Wakely's avatar
      stl_algo.h (remove): Remove too restrictive concept-check. · a5fbe527
      Jonathan Wakely authored
      2004-09-17  Jonathan Wakely  <redi@gcc.gnu.org>
      
      	* include/bits/stl_algo.h (remove): Remove too restrictive
      	concept-check.
      
      From-SVN: r87650
      a5fbe527
    • Paolo Carlini's avatar
      fstream.tcc (xsgetn): Slightly tweak conditional, as per Nathan's original suggestion. · c93af6f2
      Paolo Carlini authored
      2004-09-17  Paolo Carlini  <pcarlini@suse.de>
      
      	* include/bits/fstream.tcc (xsgetn): Slightly tweak conditional,
      	as per Nathan's original suggestion.
      
      From-SVN: r87647
      c93af6f2
    • James A. Morrison's avatar
      cfg.texi: Use @smallexample. · cd1a8088
      James A. Morrison authored
      2004-09-17  James Morrison  <phython@gcc.gnu.org>
      
              * doc/cfg.texi: Use @smallexample.
              * doc/md.texi: Likewise.
              * doc/tree-ssa.texi: Likewise.
              * doc/extend.texi: Likewise.  Use @r{} in comments.
              * doc/trouble.texi: Use @r{} in comments.
      
      From-SVN: r87646
      cd1a8088
    • David Edelsohn's avatar
      * gcc.dg/darwin-longlong.c: XFAIL on AIX and SPE. · 57f0099a
      David Edelsohn authored
      From-SVN: r87645
      57f0099a
    • Vincent Celier's avatar
      prj-attr-pm.ads, [...]: New files, to split some private capabilities of the... · 93ed8a01
      Vincent Celier authored
      prj-attr-pm.ads, [...]: New files, to split some private capabilities of the general project manager.
      
      2004-09-17  Vincent Celier  <celier@gnat.com>
      
      	* prj-attr-pm.ads, prj-attr-pm.adb: New files, to split some private
      	capabilities of the general project manager.
      
      From-SVN: r87644
      93ed8a01
    • Hans-Peter Nilsson's avatar
      configure.ac (gcc_cv_gld_version): Handle whitespace before "VERSION=". · 58ea87a9
      Hans-Peter Nilsson authored
      	* configure.ac (gcc_cv_gld_version): Handle whitespace before
      	"VERSION=".
      	* aclocal.m4 (_gcc_COMPUTE_GAS_VERSION): Ditto.
      	* configure: Regenerate.
      
      From-SVN: r87643
      58ea87a9
    • Diego Novillo's avatar
      pr17252.c: Use post-increment to change what 'a' is pointing to. · 47bb500f
      Diego Novillo authored
      	* gcc.c-torture/execute/pr17252.c: Use post-increment to
      	change what 'a' is pointing to.
      
      From-SVN: r87642
      47bb500f
    • Joern Rennecke's avatar
      Be more precise in last entry. · 788bb47d
      Joern Rennecke authored
      From-SVN: r87641
      788bb47d
    • Joern Rennecke's avatar
      sh.c (sh_gimplify_va_arg_expr): Don't call pass_by_reference. · 03603192
      Joern Rennecke authored
      	* sh.c (sh_gimplify_va_arg_expr): Don't call pass_by_reference.
      	(sh_pass_by_reference): Work around std_gimplify_va_arg_expr bug.
      	* t-sh (MULTILIB_CPUS): s/ML_m/ML_sh/g .
      	* t-sh64 (MULTILIB_CPU_DIRS): Likewise.  Match trailing slashes
      	in substitutions.
      	(MULTILIB_DIRNAMES): Remove defunct removal of /media32.
      
      From-SVN: r87640
      03603192
    • Paolo Carlini's avatar
      tune-1.cc: Use VERIFY, clean up a bit. · 3641bd55
      Paolo Carlini authored
      2004-09-17  Paolo Carlini  <pcarlini@suse.de>
      
      	* testsuite/ext/mt_allocator/tune-1.cc: Use VERIFY, clean
      	up a bit.
      	* testsuite/ext/mt_allocator/tune-2.cc: Likewise.
      	* testsuite/ext/mt_allocator/tune-3.cc: Likewise.
      	* testsuite/ext/mt_allocator/tune-4.cc: Likewise.
      
      From-SVN: r87638
      3641bd55
    • Kazu Hirata's avatar
      basic-block.h, [...]: Fix comment typos. · b01d837f
      Kazu Hirata authored
      	* basic-block.h, c-decl.c, c-parse.in, cgraphunit.c, ddg.c,
      	gimplify.c, lambda-code.c, optabs.c, predict.c,
      	tree-scalar-evolution.c, tree-sra.c, tree-ssa-loop-ch.c,
      	tree-ssa.c, vec.h: Fix comment typos.  Follow spelling
      	conventions.
      
      From-SVN: r87637
      b01d837f
    • Paolo Carlini's avatar
      basic_file_stdio.cc (__basic_file<>::close)): Don't call unnecessarily sync, that is fflush... · ee19761d
      Paolo Carlini authored
      
      2004-09-17  Paolo Carlini  <pcarlini@suse.de>
      	    Andrea Arcangeli  <andrea@suse.de>
      
      	* config/io/basic_file_stdio.cc (__basic_file<>::close)): Don't
      	call unnecessarily sync, that is fflush: the library, since 3.4.0
      	does not use buffered fread/fwrite.
      	* include/bits/fstream.tcc (basic_filebuf<>::overflow): Likewise.
      
      Co-Authored-By: default avatarAndrea Arcangeli <andrea@suse.de>
      
      From-SVN: r87636
      ee19761d
    • Kazu Hirata's avatar
      compat.texi, [...]: Use @option around options. · 4ec7afd7
      Kazu Hirata authored
      	* doc/compat.texi, doc/cpp.texi, doc/cppopts.texi,
      	doc/extend.texi, doc/install.texi, doc/invoke.texi,
      	doc/sourcebuild.texi, doc/tm.texi, doc/tree-ssa.texi,
      	doc/trouble.texi: Use @option around options.
      
      From-SVN: r87635
      4ec7afd7
    • Richard Sandiford's avatar
      * Makefile.in (gen-protos.o): Depend on errors.h. · 6eab2bc3
      Richard Sandiford authored
      From-SVN: r87634
      6eab2bc3
    • Mark Mitchell's avatar
      re PR c++/16002 (Strange error message with new parser) · 996c2b52
      Mark Mitchell authored
      	PR c++/16002
      	* parser.c (cp_parser_simple_declaration): Commit to tentative
      	parses after seeing a decl-specifier.
      	(cp_parser_simple_declaration): Eliminate spurious message.
      	(cp_parser_init_declarator): Adjust error message.
      
      	PR c++/16029
      	* lex.c (unqualified_name_lookup_error): Mark the dummy
      	declaration as used.
      
      	PR c++/16002
      	* g++.dg/template/error18.C: New test.
      
      	PR c++/16029
      	* g++.dg/warn/Wunused-8.C: New test.
      
      From-SVN: r87633
      996c2b52
Loading