diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index 64ffb4ebfd27893f96c74f2cc3a03fc0b60d38d9..c3f265f1a731d6e2f8828eb8a148d07e1b6256f3 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,11 @@
+2004-09-17  Kazu Hirata  <kazu@cs.umass.edu>
+
+	* 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.
+
 2004-09-17  Kazu Hirata  <kazu@cs.umass.edu>
 
 	* doc/compat.texi, doc/cpp.texi, doc/cppopts.texi,
diff --git a/gcc/basic-block.h b/gcc/basic-block.h
index 05baeba75a29da2182201574a827806d49000233..037f0ac4d47abe942a247978a17895a0a6f4d8aa 100644
--- a/gcc/basic-block.h
+++ b/gcc/basic-block.h
@@ -167,7 +167,7 @@ typedef struct edge_def *edge;
 #define EDGE_SIBCALL		256	/* Edge from sibcall to exit.  */
 #define EDGE_LOOP_EXIT		512	/* Exit of a loop.  */
 #define EDGE_TRUE_VALUE		1024	/* Edge taken when controlling
-					   predicate is non zero.  */
+					   predicate is nonzero.  */
 #define EDGE_FALSE_VALUE	2048	/* Edge taken when controlling
 					   predicate is zero.  */
 #define EDGE_EXECUTABLE		4096	/* Edge is executable.  Only
diff --git a/gcc/c-decl.c b/gcc/c-decl.c
index b3bd689677b28b4b5c03ae254f33b890c4842026..b29a152dacc3a06be595a767fd8aed4a778faf26 100644
--- a/gcc/c-decl.c
+++ b/gcc/c-decl.c
@@ -6284,7 +6284,7 @@ store_parm_decls (void)
   DECL_SAVED_TREE (fndecl) = push_stmt_list ();
 
   /* ??? Insert the contents of the pending sizes list into the function
-     to be evaluated.  This just changes mis-behaviour until assign_parms
+     to be evaluated.  This just changes mis-behavior until assign_parms
      phase ordering problems are resolved.  */
   {
     tree t;
diff --git a/gcc/c-parse.in b/gcc/c-parse.in
index 4fefa1bc09e796b71da2730cfc6ca5b4902be1b9..20ed784f6f30b3cc551dbe538ff0ffba5e927aa0 100644
--- a/gcc/c-parse.in
+++ b/gcc/c-parse.in
@@ -361,7 +361,7 @@ static inline int _yylex (void);
 static int  yylex (void);
 static void init_reswords (void);
 
-  /* Initialisation routine for this file.  */
+  /* Initialization routine for this file.  */
 void
 c_parse_init (void)
 {
diff --git a/gcc/cgraphunit.c b/gcc/cgraphunit.c
index e04de96fde2388c557b763befc7867edb770d862..4153504e38eb05cb3bee5ee865a9fc06608d254f 100644
--- a/gcc/cgraphunit.c
+++ b/gcc/cgraphunit.c
@@ -142,7 +142,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
         ??? Move this to separate file after tree-ssa merge.
 
 	We separate inlining decisions from the inliner itself and store it
-	inside callgraph as so called inline plan.  Reffer to cgraph.c
+	inside callgraph as so called inline plan.  Refer to cgraph.c
 	documentation about particular representation of inline plans in the
 	callgraph
 
diff --git a/gcc/ddg.c b/gcc/ddg.c
index 3cd9c6b78f544140867a61d991af3b90714f36b1..15bfc3c67a82a9be730ec8fbb59e6ba007d475d1 100644
--- a/gcc/ddg.c
+++ b/gcc/ddg.c
@@ -894,7 +894,7 @@ free_ddg_all_sccs (ddg_all_sccs_ptr all_sccs)
 
 /* Given FROM - a bitmap of source nodes - and TO - a bitmap of destination
    nodes - find all nodes that lie on paths from FROM to TO (not excluding
-   nodes from FROM and TO).  Return non zero if nodes exist.  */
+   nodes from FROM and TO).  Return nonzero if nodes exist.  */
 int
 find_nodes_on_paths (sbitmap result, ddg_ptr g, sbitmap from, sbitmap to)
 {
diff --git a/gcc/gimplify.c b/gcc/gimplify.c
index 027fd052b111fc7280c167252a407e30abb69cba..523511818926c236e585d2603424fe29dfa6b2f9 100644
--- a/gcc/gimplify.c
+++ b/gcc/gimplify.c
@@ -2363,7 +2363,7 @@ gimplify_init_ctor_preeval (tree *expr_p, tree *pre_p, tree *post_p,
      the gimplifier will consider this a store to memory.  Doing this 
      gimplification now means that we won't have to deal with complicated
      language-specific trees, nor trees like SAVE_EXPR that can induce
-     exponential search behaviour.  */
+     exponential search behavior.  */
   one = gimplify_expr (expr_p, pre_p, post_p, is_gimple_mem_rhs, fb_rvalue);
   if (one == GS_ERROR)
     {
diff --git a/gcc/lambda-code.c b/gcc/lambda-code.c
index f438fb6e27cf0e80563d3b822cf363e367185cf5..f780da57754d6dc12cac5e8dd3e2017bda02ee9c 100644
--- a/gcc/lambda-code.c
+++ b/gcc/lambda-code.c
@@ -1932,7 +1932,7 @@ lambda_loopnest_to_gcc_loopnest (struct loop *old_loopnest,
 
 
 /* Returns true when the vector V is lexicographically positive, in
-   other words, when the first non zero element is positive.  */
+   other words, when the first nonzero element is positive.  */
 
 static bool
 lambda_vector_lexico_pos (lambda_vector v, 
diff --git a/gcc/optabs.c b/gcc/optabs.c
index cc48ab539490e4ee0a7e47ba6e9ae648edaa5ad4..0b75a81cd7f548d93086bca0e014ec1a700599c7 100644
--- a/gcc/optabs.c
+++ b/gcc/optabs.c
@@ -407,7 +407,7 @@ expand_subword_shift (enum machine_mode op1_mode, optab binoptab,
     {
       /* We must avoid shifting by BITS_PER_WORD bits since that is either
 	 the same as a zero shift (if shift_mask == BITS_PER_WORD - 1) or
-	 has unknown behaviour.  Do a single shift first, then shift by the
+	 has unknown behavior.  Do a single shift first, then shift by the
 	 remainder.  It's OK to use ~OP1 as the remainder if shift counts
 	 are truncated to the mode size.  */
       carries = expand_binop (word_mode, reverse_unsigned_shift,
diff --git a/gcc/predict.c b/gcc/predict.c
index af92acaf2bd2bc761cf9b86272ceb9f8eac02b01..8a7f093f014daea0dcf5b6841270b69b8dbde6ee 100644
--- a/gcc/predict.c
+++ b/gcc/predict.c
@@ -932,7 +932,7 @@ expr_expected_value (tree expr, bitmap visited)
 
 	      /* If this PHI has itself as an argument, we cannot
 		 determine the string length of this argument.  However,
-		 if we can find a expectd constant value for the other
+		 if we can find a expected constant value for the other
 		 PHI args then we can still be sure that this is
 		 likely a constant.  So be optimistic and just
 		 continue with the next argument.  */
diff --git a/gcc/tree-scalar-evolution.c b/gcc/tree-scalar-evolution.c
index 48da0d25575bb8fa30e19fb19162407ff9055c59..35d2fe9ca8b509f7bfcf41b34a37bd0ac4f8f303 100644
--- a/gcc/tree-scalar-evolution.c
+++ b/gcc/tree-scalar-evolution.c
@@ -331,7 +331,7 @@ del_scev_info (void *e)
 
 /* Get the index corresponding to VAR in the current LOOP.  If
    it's the first time we ask for this VAR, then we return
-   chrec_not_analysed_yet for this VAR and return its index.  */
+   chrec_not_analyzed_yet for this VAR and return its index.  */
 
 static tree *
 find_var_scev_info (tree var)
diff --git a/gcc/tree-sra.c b/gcc/tree-sra.c
index 4ebc061232776ee11491c41de727408de18dcba2..e54d7d158fa056da7d3c54a7ad0a292b7bfeb633 100644
--- a/gcc/tree-sra.c
+++ b/gcc/tree-sra.c
@@ -132,7 +132,7 @@ struct sra_elt
 };
 
 /* Random access to the child of a parent is performed by hashing.
-   This prevents quadratic behaviour, and allows SRA to function
+   This prevents quadratic behavior, and allows SRA to function
    reasonably on larger records.  */
 static htab_t sra_map;
 
diff --git a/gcc/tree-ssa-loop-ch.c b/gcc/tree-ssa-loop-ch.c
index 6ba77daf2b1e47d50883c49074c5d5c269485083..4d25d0f5b31d4f2cd03e8e9f4b60b6a84752c14f 100644
--- a/gcc/tree-ssa-loop-ch.c
+++ b/gcc/tree-ssa-loop-ch.c
@@ -40,7 +40,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
 
 /* Duplicates headers of loops if they are small enough, so that the statements
    in the loop body are always executed when the loop is entered.  This
-   increases effectivity of code motion optimizations, and reduces the need
+   increases effectiveness of code motion optimizations, and reduces the need
    for loop preconditioning.  */
 
 /* Check whether we should duplicate HEADER of LOOP.  At most *LIMIT
diff --git a/gcc/tree-ssa.c b/gcc/tree-ssa.c
index 8e0975570c2a592025e72d9a6980c84c46475d00..3e9b2134f9a4edf7e05a64a36a2de008d2b2d962 100644
--- a/gcc/tree-ssa.c
+++ b/gcc/tree-ssa.c
@@ -650,8 +650,8 @@ verify_ssa (void)
   verify_alias_info ();
 
   free (definition_block);
-  /* Restore the dominance infomation to its prior known state, so
-     that we do not perturb the compiler's subsequent behaviour.  */
+  /* Restore the dominance information to its prior known state, so
+     that we do not perturb the compiler's subsequent behavior.  */
   if (orig_dom_state == DOM_NONE)
     free_dominance_info (CDI_DOMINATORS);
   else
diff --git a/gcc/vec.h b/gcc/vec.h
index 43b7eabd9ad26fda23e6d8085e3d72a264403f89..3e272d40c4717ac88054de89cb94eb87f8e0b12d 100644
--- a/gcc/vec.h
+++ b/gcc/vec.h
@@ -29,7 +29,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
    out-of-line generic functions.  The vectors are designed to
    interoperate with the GTY machinery.
 
-   Because of the different behaviour of objects and of pointers to
+   Because of the different behavior of objects and of pointers to
    objects, there are two flavors.  One to deal with a vector of
    pointers to objects, and one to deal with a vector of objects
    themselves.  Both of these pass pointers to objects around -- in
@@ -200,7 +200,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
 
    Ensure that V has at least RESERVE slots available, if RESERVE is
    >= 0.  If RESERVE < 0, ensure that there is at least one spare
-   slot.  These differ in their reallocation behaviour, the first will
+   slot.  These differ in their reallocation behavior, the first will
    not create additional headroom, but the second mechanism will
    perform the usual exponential headroom increase.  Note this can
    cause V to be reallocated.  Returns nonzero iff reallocation