diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index ceee443808e6dc8643342adbb4aa00fb949ac733..805f19f2752a410776b08f798afa9ff52bb81e2d 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,22 @@
+2003-07-06  Kazu Hirata  <kazu@cs.umass.edu>
+
+	* config/h8300/h8300.c: Fix comment typos.
+	* config/h8300/h8300.md: Likewise.
+	* config/i386/athlon.md: Likewise.
+	* config/i386/i386.c: Likewise.
+	* config/i386/pentium.md: Likewise.
+	* config/ia64/ia64.c: Likewise.
+	* config/ia64/itanium1.md: Likewise.
+	* config/ia64/itanium2.md: Likewise.
+	* config/m32r/m32r.md: Likewise.
+	* config/m68hc11/m68hc11.c: Likewise.
+	* config/mcore/mcore.c: Likewise.
+	* config/mips/sr71k.md: Likewise.
+	* config/mips/t-iris5-as: Likewise.
+	* config/mmix/mmix.h: Likewise.
+	* config/ns32k/ns32k.h: Likewise.
+	* config/ns32k/NOTES: Fix a typo.
+
 2003-07-06  Andreas Jaeger  <aj@suse.de>
 
 	* stmt.c: Convert remaining prototypes to ISO C90.
diff --git a/gcc/config/h8300/h8300.c b/gcc/config/h8300/h8300.c
index 0a794da855ad4b3b81154771e98c01188c3ed43f..5ab2bfac04d85c185f4a574abac1135ad20b42ca 100644
--- a/gcc/config/h8300/h8300.c
+++ b/gcc/config/h8300/h8300.c
@@ -1920,7 +1920,7 @@ compute_mov_length (rtx *operands)
 	    return base_length - 2;
 	  else
 	    /* In SImode and SFmode, we use two mov.w instructions, so
-	       double the adustment.  */
+	       double the adjustment.  */
 	    return base_length - 4;
 	}
 
diff --git a/gcc/config/h8300/h8300.md b/gcc/config/h8300/h8300.md
index 9a579ec3e2bec0d44a2a44ad303df81f5a5b3916..209e919b8b96065e784deca401e0d202c2791e00 100644
--- a/gcc/config/h8300/h8300.md
+++ b/gcc/config/h8300/h8300.md
@@ -4189,7 +4189,7 @@
 		      (pc)))]
   "operands[4] = GEN_INT (- INTVAL (operands[1]));")
 
-;; For certain (in)equaltity comparisons against a constant, we can
+;; For certain (in)equality comparisons against a constant, we can
 ;; XOR the register with the constant, and test the register against
 ;; 0.
 
diff --git a/gcc/config/i386/athlon.md b/gcc/config/i386/athlon.md
index 8f0abf493577ef7fea1ea4da9c0b2ac42a08e639..b90ae22c06d7e27c3a91a54020974035f0253295 100644
--- a/gcc/config/i386/athlon.md
+++ b/gcc/config/i386/athlon.md
@@ -667,7 +667,7 @@
 			      (eq_attr "type" "sseadd"))
 			 "athlon-double,athlon-fpsched,(athlon-fadd*2)")
 
-;; Conversions behaves very irregulary and the scheduling is critical here.
+;; Conversions behaves very irregularly and the scheduling is critical here.
 ;; Take each instruction separately.  Assume that the mode is always set to the
 ;; destination one and athlon_decode is set to the K8 versions.
 
diff --git a/gcc/config/i386/i386.c b/gcc/config/i386/i386.c
index 902e924c3f3c752dd4a2801d0e137275ec582b2c..dc8cebd782ec7b256399aedb486e00b68f3bfee3 100644
--- a/gcc/config/i386/i386.c
+++ b/gcc/config/i386/i386.c
@@ -2608,7 +2608,7 @@ contains_128bit_aligned_vector_p (type)
 
   if (AGGREGATE_TYPE_P (type))
     {
-      /* Walk the agregates recursively.  */
+      /* Walk the aggregates recursively.  */
       if (TREE_CODE (type) == RECORD_TYPE
 	  || TREE_CODE (type) == UNION_TYPE
 	  || TREE_CODE (type) == QUAL_UNION_TYPE)
diff --git a/gcc/config/i386/pentium.md b/gcc/config/i386/pentium.md
index 8bf224561afb5ccfc5daf5c35d405f62593d0a53..4f5ee04fd018bc6996f2ac1ed1c1477a5d7b8970 100644
--- a/gcc/config/i386/pentium.md
+++ b/gcc/config/i386/pentium.md
@@ -210,7 +210,7 @@
   "pentium-firstv")
 
 ;; Floating point instruction dispatch in U pipe, but continue
-;; in FP pipeline allowing other isntructions to be executed.
+;; in FP pipeline allowing other instructions to be executed.
 (define_insn_reservation "pent_fp" 3
   (and (eq_attr "cpu" "pentium")
        (eq_attr "type" "fop,fistp"))
diff --git a/gcc/config/ia64/ia64.c b/gcc/config/ia64/ia64.c
index 1ff3cf9fa4b7083860b522f9742fec8aa4491813..444e882457d125fb7935a1fd7c56ac39cdd4bbb6 100644
--- a/gcc/config/ia64/ia64.c
+++ b/gcc/config/ia64/ia64.c
@@ -1559,7 +1559,7 @@ ia64_split_call (retval, addr, retaddr, scratch_r, scratch_b,
       bool addr_dead_p;
 
       /* ??? We are currently constrained to *not* use peep2, because
-	 we can legitimiately change the global lifetime of the GP
+	 we can legitimately change the global lifetime of the GP
 	 (in the form of killing where previously live).  This is 
 	 because a call through a descriptor doesn't use the previous
 	 value of the GP, while a direct call does, and we do not
diff --git a/gcc/config/ia64/itanium1.md b/gcc/config/ia64/itanium1.md
index 66fa563486f8c03651aac34bd2d8380478e61af8..2b844115160b1a0450667abbc6171e6072880d09 100644
--- a/gcc/config/ia64/itanium1.md
+++ b/gcc/config/ia64/itanium1.md
@@ -178,7 +178,7 @@
           first regular expression *and* the reservation described by
           the second regular expression *and* etc.
 
-       4. "*" is used for convinience and simply means sequence in
+       4. "*" is used for convenience and simply means sequence in
           which the regular expression are repeated NUMBER times with
           cycle advancing (see ",").
 
@@ -461,7 +461,7 @@
 (define_reservation "1_F" "1_F0|1_F1|1_F2")
 
 ;;; "Each B slot in MBB or BBB bundle disperses to the corresponding B
-;;; unit. That is, a B slot in 1st position is despersed to B0.  In the
+;;; unit. That is, a B slot in 1st position is dispersed to B0.  In the
 ;;; 2nd position it is dispersed to B2".
 (define_reservation "1_NB"
     "1_0b.bb+1_unb0|1_0bb.b+1_unb1|1_0bbb.+1_unb2\
@@ -908,7 +908,7 @@
 
 ;; Bypasses:
 (define_bypass  1 "1_fcmp" "1_br,1_scall")
-;; ??? I found 7 cycle dealy for 1_fmac -> 1_fcmp for Itanium1
+;; ??? I found 7 cycle delay for 1_fmac -> 1_fcmp for Itanium1
 (define_bypass  7 "1_fmac" "1_fmisc,1_fcvtfx,1_xmpy,1_fcmp")
 
 ;; ???
@@ -1235,7 +1235,7 @@
     |1b_1mf.i+1_5+1b_uf1|1b_1mf.b+1_5+1b_uf1")
 
 ;;; "Each B slot in MBB or BBB bundle disperses to the corresponding B
-;;; unit. That is, a B slot in 1st position is despersed to B0.  In the
+;;; unit. That is, a B slot in 1st position is dispersed to B0.  In the
 ;;; 2nd position it is dispersed to B2".
 (define_reservation "1b_NB"
     "1b_0b.bb+1_1+1b_unb0|1b_0bb.b+1_2+1b_unb1|1b_0bbb.+1_3+1b_unb2\
diff --git a/gcc/config/ia64/itanium2.md b/gcc/config/ia64/itanium2.md
index d4adf0eeff754bcc70ed087d860a75f856575313..0cdb07013467993db05ac5d7f6fbdaa147076a1a 100644
--- a/gcc/config/ia64/itanium2.md
+++ b/gcc/config/ia64/itanium2.md
@@ -176,7 +176,7 @@
           first regular expression *and* the reservation described by
           the second regular expression *and* etc.
 
-       4. "*" is used for convinience and simply means sequence in
+       4. "*" is used for convenience and simply means sequence in
           which the regular expression are repeated NUMBER times with
           cycle advancing (see ",").
 
@@ -524,7 +524,7 @@
 (define_reservation "2_F" "2_F0|2_F1|2_F2")
 
 ;;; "Each B slot in MBB or BBB bundle disperses to the corresponding B
-;;; unit. That is, a B slot in 1st position is despersed to B0.  In the
+;;; unit. That is, a B slot in 1st position is dispersed to B0.  In the
 ;;; 2nd position it is dispersed to B2".
 (define_reservation "2_NB"
     "2_0b.bb+2_unb0|2_0bb.b+2_unb1|2_0bbb.+2_unb2\
@@ -1349,7 +1349,7 @@
     |2b_1mf.i+2_5+2b_uf1|2b_1mmf.+2_6+2b_uf1|2b_1mf.b+2_5+2b_uf1")
 
 ;;; "Each B slot in MBB or BBB bundle disperses to the corresponding B
-;;; unit. That is, a B slot in 1st position is despersed to B0.  In the
+;;; unit. That is, a B slot in 1st position is dispersed to B0.  In the
 ;;; 2nd position it is dispersed to B2".
 (define_reservation "2b_NB"
     "2b_0b.bb+2_1+2b_unb0|2b_0bb.b+2_2+2b_unb1|2b_0bbb.+2_3+2b_unb2\
diff --git a/gcc/config/m32r/m32r.md b/gcc/config/m32r/m32r.md
index 1dff60e5beeec4f525f34cf0e215cd7ec3932702..b5ca402e1637eb10f72f103d5f89c6ce47da8bcd 100644
--- a/gcc/config/m32r/m32r.md
+++ b/gcc/config/m32r/m32r.md
@@ -204,7 +204,7 @@
 ;; Function units of the M32R
 ;; Units that take one cycle do not need to be specified.
 
-;; (define_function_unit {name} {multiplicity} {simulataneity} {test}
+;; (define_function_unit {name} {multiplicity} {simultaneity} {test}
 ;;                       {ready-delay} {issue-delay} [{conflict-list}])
 
 ;; Hack to get GCC to better pack the instructions.
@@ -2537,7 +2537,7 @@
 ;;         st r4,@(4,sp) 
 ;;         bl sub
 ;; 
-;; Simialr code is produced for the subtract expression.  With this
+;; Similar code is produced for the subtract expression.  With this
 ;; peephole the redundant move is eliminated.
 ;;
 ;; This optimization only works if PRESERVE_DEATH_INFO_REGNO_P is
diff --git a/gcc/config/m68hc11/m68hc11.c b/gcc/config/m68hc11/m68hc11.c
index 61e88de5b96cf8be492f69fdde4c5398b83e6966..38690ee7319335e63b3a2a2117ef3cda5656ffd4 100644
--- a/gcc/config/m68hc11/m68hc11.c
+++ b/gcc/config/m68hc11/m68hc11.c
@@ -5185,7 +5185,7 @@ m68hc11_reorg ()
   if (optimize)
     compute_bb_for_insn ();
 
-  /* After some splitting, there are some oportunities for CSE pass.
+  /* After some splitting, there are some opportunities for CSE pass.
      This happens quite often when 32-bit or above patterns are split.  */
   if (optimize > 0 && split_done)
     {
diff --git a/gcc/config/mcore/mcore.c b/gcc/config/mcore/mcore.c
index d88307aed2300133a40e4e9bd13cf0748f2601b3..59c04d6c839cb2dfebe1ce15945e370bcff16bbf 100644
--- a/gcc/config/mcore/mcore.c
+++ b/gcc/config/mcore/mcore.c
@@ -2651,7 +2651,7 @@ typedef struct
 
 /* The maximum number of constants that can fit into one pool, since
    the pc relative range is 0...1020 bytes and constants are at least 4
-   bytes long.  We subtact 4 from the range to allow for the case where
+   bytes long.  We subtract 4 from the range to allow for the case where
    we need to add a branch/align before the constant pool.  */
 
 #define MAX_COUNT 1016
diff --git a/gcc/config/mips/sr71k.md b/gcc/config/mips/sr71k.md
index 76417b620f810fc91783a70d531a4ea858dc4ec6..d6c7cafa083dabd2a33849f5c82230d7ddf08112 100644
--- a/gcc/config/mips/sr71k.md
+++ b/gcc/config/mips/sr71k.md
@@ -2,7 +2,7 @@
 ;;
 ;; DFA-based pipeline description for Sandcraft SR3 (MIPS64 based)
 ;;
-;; The SR3 is describeds as:
+;; The SR3 is described as:
 ;;     - nine-stage pipeline, insn buffering with out-of-order issue to
 ;;       multiple function units, with an average dispatch rate of 2
 ;;       insn.s per cycle (max 6 insns: 2 fpu, 4 cpu).
@@ -22,8 +22,8 @@
 ;;
 ;;
 ;; Reservation model is based on:
-;;   1) Figure 6-1, from the 1.0 specicification.
-;;   2) Chapter 19, from the 1.0 specificication.
+;;   1) Figure 6-1, from the 1.0 specification.
+;;   2) Chapter 19, from the 1.0 specification.
 ;;   3) following questions(Red Hat)/answers(Sandcraft):
 ;;     RH> From Section 19.1
 ;;     RH>      1) In terms of figure 6-1, are all the instructions in
diff --git a/gcc/config/mips/t-iris5-as b/gcc/config/mips/t-iris5-as
index 0ba093c40579063e50a39a969eb26f4229c2eb29..a1e48956a56f4a6fa9e691fb5d365bb9c65327ee 100644
--- a/gcc/config/mips/t-iris5-as
+++ b/gcc/config/mips/t-iris5-as
@@ -1,5 +1,5 @@
 # omit -g, gcc doesn't support the o32 mdebug debugging format and warns about
-# every invokation with -g*
+# every invocation with -g*
 # add -save-temps to avoid comparison failure due to embedded temp file names
 BOOT_CFLAGS = -O2 -save-temps
 
diff --git a/gcc/config/mmix/mmix.h b/gcc/config/mmix/mmix.h
index 502dcfe51fe7995874060cdc6595599dc12b137a..62a258eccf7e7d3709ae75b974d628e5b0d9e376 100644
--- a/gcc/config/mmix/mmix.h
+++ b/gcc/config/mmix/mmix.h
@@ -169,7 +169,7 @@ extern int target_flags;
    address goes in a global register.  When addressing, it's more like
    "base address plus offset", with the offset being 0..255 from the base,
    which itself can be a symbol plus an offset.  The effect is like having
-   a constant pool in global registers, code offseting from those
+   a constant pool in global registers, code offsetting from those
    registers (automatically causing a request for a suitable constant base
    address register) without having to know the specific register or the
    specific offset.  The setback is that there's a limited number of
diff --git a/gcc/config/ns32k/NOTES b/gcc/config/ns32k/NOTES
index 6c5ff9bce7a5cf3113362e279a62144fa94e264e..32e9704d95f7d7048febad52223ebd36f1e6a742 100644
--- a/gcc/config/ns32k/NOTES
+++ b/gcc/config/ns32k/NOTES
@@ -53,7 +53,7 @@ For example, the emitted code for the case of LT is
 which is, in effect, "branch if ordered and less than."
 
 We also need insns for the reverse branches. These have the PC and
-the label ref opereands reversed. Thus the reverse bgt has a pattern:
+the label ref operands reversed. Thus the reverse bgt has a pattern:
 
  (set (pc)
 	(if_then_else (gt (cc0)
diff --git a/gcc/config/ns32k/ns32k.h b/gcc/config/ns32k/ns32k.h
index 0236a420da9959d25c7d38659a82712bbe89f018..dfe131b1e61c3a1177e0b0ac14cdd97b60d40dae 100644
--- a/gcc/config/ns32k/ns32k.h
+++ b/gcc/config/ns32k/ns32k.h
@@ -472,7 +472,7 @@ enum reg_class
 
 
 /* LONG_REGS are registers which can only hold double precision floats
- * and can only be accessable by long float instructions.
+ * and can only be accessible by long float instructions.
  */
 #define CANNOT_CHANGE_MODE_CLASS(FROM, TO, CLASS)	\
   (GET_MODE_SIZE (FROM) != GET_MODE_SIZE (TO)		\
@@ -885,7 +885,7 @@ __transfer_from_trampoline ()		\
 #endif
 
 /* SMALL_REGISTER_CLASSES is a run time option. This should no longer
-   be necessay and should go when we have confidence that we won't run
+   be necessary and should go when we have confidence that we won't run
    out of spill registers */
 #define SMALL_REGISTER_CLASSES (target_flags & MASK_SRC)