diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index e9f5558d23d9fc6f644e978765ed75495e6d8f32..25772a9f6a6d3c7fbf20c522a806012151d1344b 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,22 @@
+2005-07-28  Volker Reichelt  <reichelt@igpm.rwth-aachen.de>
+
+	* builtins.c: Fix comment typo(s).
+	* genautomata.c: Likewise.
+	* gimplify.c: Likewise.
+	* tree-dfa.c: Likewise.
+	* tree-flow-inline.h: Likewise.
+	* tree-into-ssa.c: Likewise.
+	* tree-ssa-alias.c: Likewise.
+	* tree-ssa-ccp.c: Likewise.
+	* tree-ssa-copy.c: Likewise.
+	* tree-ssa-dce.c: Likewise.
+	* tree-ssa-dom.c: Likewise.
+	* tree-ssa-operands.c: Likewise.
+	* tree-tailcall.c: Likewise.
+	* tree-vectorizer.c: Likewise.
+	* tree-vrp.c: Likewise.
+	* tree.c: Likewise.
+
 2005-07-28  Jeff Law  <law@redhat.com>
 
         * tree-vrp.c (test_for_singularity): Extracted from  ...
diff --git a/gcc/builtins.c b/gcc/builtins.c
index b032fc4378489cc3b7d858abbccc0b3ce5fdc547..bd187c18356b7b0a97c9d6907e7213eca7794d30 100644
--- a/gcc/builtins.c
+++ b/gcc/builtins.c
@@ -431,7 +431,7 @@ c_readstr (const char *str, enum machine_mode mode)
 }
 
 /* Cast a target constant CST to target CHAR and if that value fits into
-   host char type, return zero and put that value into variable pointed by
+   host char type, return zero and put that value into variable pointed to by
    P.  */
 
 static int
diff --git a/gcc/genautomata.c b/gcc/genautomata.c
index 3748564083b5a7b6f435c31532067107afe1ae0a..e39d32727a9564ffd27d5f9074f9761b99b5f9d2 100644
--- a/gcc/genautomata.c
+++ b/gcc/genautomata.c
@@ -7632,7 +7632,7 @@ output_state_ainsn_table (state_ainsn_table_t tab, char *table_name,
 }
 
 /* The following function adds vector with length VECT_LENGTH and
-   elements pointed by VECT to table TAB as its line with number
+   elements pointed to by VECT to table TAB as its line with number
    VECT_NUM.  */
 static void
 add_vect (state_ainsn_table_t tab, int vect_num, vect_el_t *vect,
diff --git a/gcc/gimplify.c b/gcc/gimplify.c
index bb08c2b140f78442b0f3d70c256368560e81be70..16a6aae69de9e03a87e6b1bc5269ab1c5f32c3b9 100644
--- a/gcc/gimplify.c
+++ b/gcc/gimplify.c
@@ -236,7 +236,7 @@ append_to_statement_list_1 (tree t, tree *list_p)
   tsi_link_after (&i, t, TSI_CONTINUE_LINKING);
 }
 
-/* Add T to the end of the list container pointed by LIST_P.
+/* Add T to the end of the list container pointed to by LIST_P.
    If T is an expression with no effects, it is ignored.  */
 
 void
@@ -1409,7 +1409,7 @@ gimplify_conversion (tree *expr_p)
 }
 
 /* Gimplify the COMPONENT_REF, ARRAY_REF, REALPART_EXPR or IMAGPART_EXPR
-   node pointed by EXPR_P.
+   node pointed to by EXPR_P.
 
       compound_lval
 	      : min_lval '[' val ']'
@@ -1593,7 +1593,8 @@ gimplify_compound_lval (tree *expr_p, tree *pre_p,
   return ret;
 }
 
-/*  Gimplify the self modifying expression pointed by EXPR_P (++, --, +=, -=).
+/*  Gimplify the self modifying expression pointed to by EXPR_P
+    (++, --, +=, -=).
 
     PRE_P points to the list where side effects that must happen before
 	*EXPR_P should be stored.
@@ -1721,7 +1722,7 @@ gimplify_arg (tree *expr_p, tree *pre_p)
   return gimplify_expr (expr_p, pre_p, NULL, test, fb);
 }
 
-/* Gimplify the CALL_EXPR node pointed by EXPR_P.  PRE_P points to the
+/* Gimplify the CALL_EXPR node pointed to by EXPR_P.  PRE_P points to the
    list where side effects that must happen before *EXPR_P should be stored.
    WANT_VALUE is true if the result of the call is desired.  */
 
@@ -2111,7 +2112,7 @@ gimple_boolify (tree expr)
     }
 }
 
-/*  Convert the conditional expression pointed by EXPR_P '(p) ? a : b;'
+/*  Convert the conditional expression pointed to by EXPR_P '(p) ? a : b;'
     into
 
     if (p)			if (p)
@@ -3109,7 +3110,7 @@ gimplify_modify_expr_complex_part (tree *expr_p, tree *pre_p, bool want_value)
   return GS_ALL_DONE;
 }
 
-/* Gimplify the MODIFY_EXPR node pointed by EXPR_P.
+/* Gimplify the MODIFY_EXPR node pointed to by EXPR_P.
 
       modify_expr
 	      : varname '=' rhs
@@ -3372,7 +3373,7 @@ gimplify_save_expr (tree *expr_p, tree *pre_p, tree *post_p)
   return ret;
 }
 
-/*  Re-write the ADDR_EXPR node pointed by EXPR_P
+/*  Re-write the ADDR_EXPR node pointed to by EXPR_P
 
       unary_expr
 	      : ...
@@ -3868,7 +3869,7 @@ gimplify_to_stmt_list (tree *stmt_p)
 }
 
 
-/*  Gimplifies the expression tree pointed by EXPR_P.  Return 0 if
+/*  Gimplifies the expression tree pointed to by EXPR_P.  Return 0 if
     gimplification failed.
 
     PRE_P points to the list where side effects that must happen before
@@ -4702,7 +4703,7 @@ check_pointer_types_r (tree *tp, int *walk_subtrees ATTRIBUTE_UNUSED,
 }
 #endif
 
-/* Gimplify the body of statements pointed by BODY_P.  FNDECL is the
+/* Gimplify the body of statements pointed to by BODY_P.  FNDECL is the
    function decl containing BODY.  */
 
 void
diff --git a/gcc/tree-dfa.c b/gcc/tree-dfa.c
index beb83fbe829bfc3ea33a64298d9fa37af4b7f8c4..7504d790f747e5828dcbc17ff1a165c807cd3ec4 100644
--- a/gcc/tree-dfa.c
+++ b/gcc/tree-dfa.c
@@ -463,7 +463,7 @@ debug_dfa_stats (void)
 }
 
 
-/* Collect DFA statistics and store them in the structure pointed by
+/* Collect DFA statistics and store them in the structure pointed to by
    DFA_STATS_P.  */
 
 static void
diff --git a/gcc/tree-flow-inline.h b/gcc/tree-flow-inline.h
index 7bcfefd1776d766ef60c323c966816465a775ebd..299e1b51240e73cdd1bd7d699a169000db5cf862 100644
--- a/gcc/tree-flow-inline.h
+++ b/gcc/tree-flow-inline.h
@@ -56,7 +56,7 @@ end_htab_p (htab_iterator *hti)
   return false;
 }
 
-/* Advance the hashtable iterator pointed by HTI to the next element of the
+/* Advance the hashtable iterator pointed to by HTI to the next element of the
    hashtable.  */
 
 static inline void *
@@ -321,7 +321,7 @@ link_imm_use (ssa_use_operand_t *linknode, tree def)
     }
 }
 
-/* Set the value of a use pointed by USE to VAL.  */
+/* Set the value of a use pointed to by USE to VAL.  */
 static inline void
 set_ssa_use_from_ptr (use_operand_p use, tree val)
 {
diff --git a/gcc/tree-into-ssa.c b/gcc/tree-into-ssa.c
index 5885c04e682185bfb054912c629b38b6247fb6e7..97ddc73ab54cbfe1c3e362ba9e64ccfc857ff513 100644
--- a/gcc/tree-into-ssa.c
+++ b/gcc/tree-into-ssa.c
@@ -889,7 +889,7 @@ insert_phi_nodes (bitmap *dfs)
 
 /* Register DEF (an SSA_NAME) to be a new definition for its underlying
    variable (SSA_NAME_VAR (DEF)) and push VAR's current reaching definition
-   into the stack pointed by BLOCK_DEFS_P.  */
+   into the stack pointed to by BLOCK_DEFS_P.  */
 
 void
 register_new_def (tree def, VEC(tree,heap) **block_defs_p)
@@ -1486,7 +1486,7 @@ rewrite_update_stmt (struct dom_walk_data *walk_data ATTRIBUTE_UNUSED,
 }
 
 
-/* Replace the operand pointed by USE_P with USE's current reaching
+/* Replace the operand pointed to by USE_P with USE's current reaching
    definition.  */
 
 static inline void
diff --git a/gcc/tree-ssa-alias.c b/gcc/tree-ssa-alias.c
index d2079030cde5c65f364a39c08af8ac84f5021f4a..3b08b23de963d3b3423fb583bd2743022a9c9395 100644
--- a/gcc/tree-ssa-alias.c
+++ b/gcc/tree-ssa-alias.c
@@ -2128,7 +2128,7 @@ dump_points_to_info (FILE *file)
 }
 
 
-/* Dump points-to info pointed by PTO into STDERR.  */
+/* Dump points-to info pointed to by PTO into STDERR.  */
 
 void
 debug_points_to_info (void)
diff --git a/gcc/tree-ssa-ccp.c b/gcc/tree-ssa-ccp.c
index 829bba94132be098130a83943fb48b6490ae3f99..3edf3e7408b34cbe62f2a571e6d73b5fa9eaf63a 100644
--- a/gcc/tree-ssa-ccp.c
+++ b/gcc/tree-ssa-ccp.c
@@ -2232,7 +2232,7 @@ ccp_fold_builtin (tree stmt, tree fn)
 }
 
 
-/* Fold the statement pointed by STMT_P.  In some cases, this function may
+/* Fold the statement pointed to by STMT_P.  In some cases, this function may
    replace the whole statement with a new one.  Returns true iff folding
    makes any changes.  */
 
diff --git a/gcc/tree-ssa-copy.c b/gcc/tree-ssa-copy.c
index 28b19d945e48e8dbe947a4a0fb214fd610b3e88c..d94b1b0f22e998d91c3a28e11b48e0ae72688ad5 100644
--- a/gcc/tree-ssa-copy.c
+++ b/gcc/tree-ssa-copy.c
@@ -267,7 +267,7 @@ replace_exp_1 (use_operand_p op_p, tree val,
 
 
 /* Propagate the value VAL (assumed to be a constant or another SSA_NAME)
-   into the operand pointed by OP_P.
+   into the operand pointed to by OP_P.
 
    Use this version for const/copy propagation as it will perform additional
    checks to ensure validity of the const/copy propagation.  */
@@ -280,7 +280,7 @@ propagate_value (use_operand_p op_p, tree val)
 
 
 /* Propagate the value VAL (assumed to be a constant or another SSA_NAME)
-   into the tree pointed by OP_P.
+   into the tree pointed to by OP_P.
 
    Use this version for const/copy propagation when SSA operands are not
    available.  It will perform the additional checks to ensure validity of
diff --git a/gcc/tree-ssa-dce.c b/gcc/tree-ssa-dce.c
index abd4d7ae77a75d52140a59a809e43dee042de167..8902d2a2e0a398153013feaeb998018ce42a6f17 100644
--- a/gcc/tree-ssa-dce.c
+++ b/gcc/tree-ssa-dce.c
@@ -707,7 +707,7 @@ remove_dead_phis (basic_block bb)
     }
 }
 
-/* Remove dead statement pointed by iterator I.  Receives the basic block BB
+/* Remove dead statement pointed to by iterator I.  Receives the basic block BB
    containing I so that we don't have to look it up.  */
 
 static void
diff --git a/gcc/tree-ssa-dom.c b/gcc/tree-ssa-dom.c
index 7b79c79caa3758aa5336ac1ef97ad7ee17c13cc6..691887ce40f16d141f6cadaefe66169845303b7b 100644
--- a/gcc/tree-ssa-dom.c
+++ b/gcc/tree-ssa-dom.c
@@ -884,7 +884,7 @@ dom_opt_initialize_block (struct dom_walk_data *walk_data ATTRIBUTE_UNUSED,
 }
 
 /* Given an expression EXPR (a relational expression or a statement), 
-   initialize the hash table element pointed by by ELEMENT.  */
+   initialize the hash table element pointed to by ELEMENT.  */
 
 static void
 initialize_hash_element (tree expr, tree lhs, struct expr_hash_elt *element)
@@ -2851,7 +2851,7 @@ cprop_into_stmt (tree stmt)
 }
 
 
-/* Optimize the statement pointed by iterator SI.
+/* Optimize the statement pointed to by iterator SI.
    
    We try to perform some simplistic global redundancy elimination and
    constant propagation:
@@ -3061,7 +3061,7 @@ update_rhs_and_lookup_avail_expr (tree stmt, tree new_rhs, bool insert)
    NULL_TREE.
 
    Also, when an expression is first inserted in the AVAIL_EXPRS table, it
-   is also added to the stack pointed by BLOCK_AVAIL_EXPRS_P, so that they
+   is also added to the stack pointed to by BLOCK_AVAIL_EXPRS_P, so that they
    can be removed when we finish processing this block and its children.
 
    NOTE: This function assumes that STMT is a MODIFY_EXPR node that
diff --git a/gcc/tree-ssa-operands.c b/gcc/tree-ssa-operands.c
index c80ec5d4b6e50e8eab0d329c2cfad1eb170b0222..9fa85ad264050877c2802974a2825c5172baa988 100644
--- a/gcc/tree-ssa-operands.c
+++ b/gcc/tree-ssa-operands.c
@@ -1207,9 +1207,9 @@ swap_tree_operands (tree stmt, tree *exp0, tree *exp1)
 }
 
 
-/* Recursively scan the expression pointed by EXPR_P in statement referred to
-   by INFO.  FLAGS is one of the OPF_* constants modifying how to interpret the
-   operands found.  */
+/* Recursively scan the expression pointed to by EXPR_P in statement referred
+   to by INFO.  FLAGS is one of the OPF_* constants modifying how to interpret
+   the operands found.  */
 
 static void
 get_expr_operands (tree stmt, tree *expr_p, int flags)
diff --git a/gcc/tree-tailcall.c b/gcc/tree-tailcall.c
index 3c7518d7b860227e1895a856135738b60dc47107..7d510af778225cb7645d945976a2d59c09f1467f 100644
--- a/gcc/tree-tailcall.c
+++ b/gcc/tree-tailcall.c
@@ -192,7 +192,7 @@ suitable_for_tail_call_opt_p (void)
 }
 
 /* Checks whether the expression EXPR in stmt AT is independent of the
-   statement pointed by BSI (in a sense that we already know EXPR's value
+   statement pointed to by BSI (in a sense that we already know EXPR's value
    at BSI).  We use the fact that we are only called from the chain of
    basic blocks that have only single successor.  Returns the expression
    containing the value of EXPR at BSI.  */
diff --git a/gcc/tree-vectorizer.c b/gcc/tree-vectorizer.c
index b38156aab1a06dc2a6bda139b8bbd1cf4665549c..4bdb552fa848dbf718ff6755191f8e2bcd7fa91b 100644
--- a/gcc/tree-vectorizer.c
+++ b/gcc/tree-vectorizer.c
@@ -91,7 +91,7 @@ Software Foundation, 51 Franklin Street, Fifth Floor, Boston, MA
 
    To vectorize stmt S2, the vectorizer first finds the stmt that defines
    the operand 'b' (S1), and gets the relevant vector def 'vb' from the
-   vector stmt VS1 pointed by STMT_VINFO_VEC_STMT (stmt_info (S1)). The
+   vector stmt VS1 pointed to by STMT_VINFO_VEC_STMT (stmt_info (S1)). The
    resulting sequence would be:
 
    VS1: vb = px[i];
diff --git a/gcc/tree-vrp.c b/gcc/tree-vrp.c
index be5f8b80b86a5c9582d6975f5a5936ef31742471..4afe4151a4558af4d2980101c04579404f7450a0 100644
--- a/gcc/tree-vrp.c
+++ b/gcc/tree-vrp.c
@@ -2239,7 +2239,7 @@ register_new_assert_for (tree name,
 
 
 /* Try to register an edge assertion for SSA name NAME on edge E for
-   the conditional jump pointed by SI.  Return true if an assertion
+   the conditional jump pointed to by SI.  Return true if an assertion
    for NAME could be registered.  */
 
 static bool
diff --git a/gcc/tree.c b/gcc/tree.c
index 770ed31385672d94bb504f39a4cc6bedf3c94ee9..39e2f1f9e3c3e463461427857bb99aeffde12088 100644
--- a/gcc/tree.c
+++ b/gcc/tree.c
@@ -883,7 +883,7 @@ cst_and_fits_in_hwi (tree x)
 }
 
 /* Return a new VECTOR_CST node whose type is TYPE and whose values
-   are in a list pointed by VALS.  */
+   are in a list pointed to by VALS.  */
 
 tree
 build_vector (tree type, tree vals)
@@ -926,7 +926,7 @@ build_vector_from_ctor (tree type, VEC(constructor_elt,gc) *v)
 }
 
 /* Return a new CONSTRUCTOR node whose type is TYPE and whose values
-   are in the VEC pointed by VALS.  */
+   are in the VEC pointed to by VALS.  */
 tree
 build_constructor (tree type, VEC(constructor_elt,gc) *vals)
 {