diff --git a/gcc/ChangeLog b/gcc/ChangeLog
index 9b5241971eddc11b809a367a24f4686da6e4b0bd..f8dc5510003b60adc30ac5c34b9eca546152fcf3 100644
--- a/gcc/ChangeLog
+++ b/gcc/ChangeLog
@@ -1,3 +1,24 @@
+2002-01-18  Kazu Hirata  <kazu@hxi.com>
+
+	* bitmap.h: Fix comment formatting.
+	* combine.c: Likewise.
+	* cppfiles.c: Likewise.
+	* c-pragma.h: Likewise.
+	* c-typeck.c: Likewise.
+	* df.c: Likewise.
+	* dwarf2out.c: Likewise.
+	* function.c: Likewise.
+	* gcc.c: Likewise.
+	* genattrtab.c: Likewise.
+	* gthr-win32.h: Likewise.
+	* haifa-sched.c: Likewise.
+	* predict.c: Likewise.
+	* rtlanal.c: Likewise.
+	* rtl.h: Likewise.
+	* unwind-dw2-fde.h: Likewise.
+	* unwind-pe.h: Likewise.
+	* vmsdbgout.c: Likewise.
+
 Thu Jan 17 15:28:26 2002  Richard Kenner  <kenner@vlsi1.ultra.nyu.edu>
 
 	* attribs.c (decl_attributes): Clear ATTR_FLAG_TYPE_IN_PLACE
diff --git a/gcc/bitmap.h b/gcc/bitmap.h
index 802642af8044bb9fd4677a419cfcd650d3b9e874..8925d86b210093386d6a7e95c259cf338350ccb2 100644
--- a/gcc/bitmap.h
+++ b/gcc/bitmap.h
@@ -1,5 +1,6 @@
 /* Functions to support general ended bitmaps.
-   Copyright (C) 1997, 1998, 1999, 2000, 2001 Free Software Foundation, Inc.
+   Copyright (C) 1997, 1998, 1999, 2000, 2001, 2002
+   Free Software Foundation, Inc.
 
 This file is part of GCC.
 
@@ -311,7 +312,7 @@ do {									\
 									\
       if (ptr2_ == 0)							\
 	{								\
-	  /* If there are no more elements in BITMAP2, exit loop now.*/	\
+	  /* If there are no more elements in BITMAP2, exit loop now.  */ \
 	  ptr1_ = (bitmap_element *)0;					\
 	  break;							\
 	}								\
diff --git a/gcc/c-pragma.h b/gcc/c-pragma.h
index dddfaceec2e37dc70e7aca006c8a18910c82896e..ff00f3250f8710cabdd973f9db3e5d6e793defaa 100644
--- a/gcc/c-pragma.h
+++ b/gcc/c-pragma.h
@@ -1,5 +1,6 @@
 /* Pragma related interfaces.
-   Copyright (C) 1995, 1998, 1999, 2000, 2001 Free Software Foundation, Inc.
+   Copyright (C) 1995, 1998, 1999, 2000, 2001, 2002
+   Free Software Foundation, Inc.
 
 This file is part of GCC.
 
@@ -44,7 +45,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
 extern void init_pragma PARAMS ((void));
 
 /* Duplicate prototypes for the register_pragma stuff and the typedef for
-   cpp_reader, to avoid dragging cpplib.h in almost everywhere... */
+   cpp_reader, to avoid dragging cpplib.h in almost everywhere...  */
 #ifndef GCC_CPPLIB_H
 typedef struct cpp_reader cpp_reader;
 
diff --git a/gcc/c-typeck.c b/gcc/c-typeck.c
index 5fb05ef5d67f8d179550c1fba990b9f48b727c2f..756832d44022cc3801a2530696fdff0a9296cafb 100644
--- a/gcc/c-typeck.c
+++ b/gcc/c-typeck.c
@@ -4404,7 +4404,7 @@ warn_for_assignment (msgid, opname, function, argnum)
 	}
       else
 	{
-	  /* Function name unknown (call through ptr); just give arg number.*/
+	  /* Function name unknown (call through ptr); just give arg number.  */
 	  const char *const argnofun = _("passing arg %d of pointer to function");
 	  new_opname = (char *) alloca (strlen (argnofun) + 1 + 25 /*%d*/ + 1);
 	  sprintf (new_opname, argnofun, argnum);
diff --git a/gcc/combine.c b/gcc/combine.c
index 74f426c0cf0beec8e8e6aa8da2c32697e167dba3..a5c29f04c3cfd550f79e727b8828fb2dab9516ea 100644
--- a/gcc/combine.c
+++ b/gcc/combine.c
@@ -7057,7 +7057,7 @@ force_to_mode (x, mode, mask, reg, just_select)
 
     case NEG:
       /* If we just want the low-order bit, the NEG isn't needed since it
-	 won't change the low-order bit.    */
+	 won't change the low-order bit.  */
       if (mask == 1)
 	return force_to_mode (XEXP (x, 0), mode, mask, reg, just_select);
 
diff --git a/gcc/cppfiles.c b/gcc/cppfiles.c
index 4fffce1ce08e8c381e5a140ea039870a6c5d6bb7..4c595a857055d48e5d41ece898662774282f9c2c 100644
--- a/gcc/cppfiles.c
+++ b/gcc/cppfiles.c
@@ -94,7 +94,7 @@ struct include_file
 };
 
 /* Variable length record files on VMS will have a stat size that includes
-   record control characters that won't be included in the read size. */
+   record control characters that won't be included in the read size.  */
 #ifdef VMS
 # define FAB_C_VAR 2 /* variable length records (see Starlet fabdef.h) */
 # define STAT_SIZE_TOO_BIG(ST) ((ST).st_fab_rfm == FAB_C_VAR)
diff --git a/gcc/df.c b/gcc/df.c
index a6a474c42160eb2f24c7eff7f2eeb36ae0b647ff..1051c0fdbb47b6680efe9ebb18fe0beaafa5e2a9 100644
--- a/gcc/df.c
+++ b/gcc/df.c
@@ -1,5 +1,5 @@
 /* Dataflow support routines.
-   Copyright (C) 1999, 2000, 2001 Free Software Foundation, Inc.
+   Copyright (C) 1999, 2000, 2001, 2002 Free Software Foundation, Inc.
    Contributed by Michael P. Hayes (m.hayes@elec.canterbury.ac.nz,
                                     mhayes@redhat.com)
 
@@ -1088,7 +1088,7 @@ df_uses_record (df, loc, ref_type, bb, insn, flags)
 				  insn, DF_REF_READ_WRITE);
 		  break;
 		}
-	      /* ... FALLTHRU ... */
+	      /* ... FALLTHRU ...  */
 	    case REG:
 	    case PC:
 	      break;
diff --git a/gcc/dwarf2out.c b/gcc/dwarf2out.c
index 9b8e4a417f9a65cccb3c2f09263e0b0e1bb1fa28..a5073214e1d05e565001405937de670cfc2d9f24 100644
--- a/gcc/dwarf2out.c
+++ b/gcc/dwarf2out.c
@@ -2106,7 +2106,7 @@ dwarf2out_end_epilogue ()
   char label[MAX_ARTIFICIAL_LABEL_BYTES];
 
   /* Output a label to mark the endpoint of the code generated for this
-     function.        */
+     function.  */
   ASM_GENERATE_INTERNAL_LABEL (label, FUNC_END_LABEL, current_funcdef_number);
   ASM_OUTPUT_LABEL (asm_out_file, label);
   fde = &fde_table[fde_table_in_use - 1];
@@ -8193,7 +8193,7 @@ loc_descriptor_from_tree (loc, addressp)
 			  TREE_OPERAND (loc, 0), TREE_OPERAND (loc, 1)),
 		   TREE_OPERAND (loc, 1), TREE_OPERAND (loc, 0));
 
-      /* ... fall through ... */
+      /* ... fall through ...  */
 
     case COND_EXPR:
       {
@@ -8971,7 +8971,7 @@ add_bound_info (subrange_die, bound_attr, bound)
     case ERROR_MARK:
       return;
 
-    /* All fixed-bounds are represented by INTEGER_CST nodes.        */
+    /* All fixed-bounds are represented by INTEGER_CST nodes.  */
     case INTEGER_CST:
       if (! host_integerp (bound, 0)
 	  || (bound_attr == DW_AT_lower_bound
diff --git a/gcc/function.c b/gcc/function.c
index 12300f33714ca554f57b0145de5dc18f268ba27a..4cff6bb7e7760942c45ab3c8d9818db229f48160 100644
--- a/gcc/function.c
+++ b/gcc/function.c
@@ -5139,7 +5139,7 @@ promoted_input_arg (regno, pmode, punsignedp)
 /*  offset_ptr will be negative for ARGS_GROW_DOWNWARD case;
     initial_offset_ptr is positive because locate_and_pad_parm's
     callers pass in the total size of args so far as
-    initial_offset_ptr. arg_size_ptr is always positive.*/
+    initial_offset_ptr. arg_size_ptr is always positive.  */
 
 void
 locate_and_pad_parm (passed_mode, type, in_regs, fndecl,
@@ -7164,7 +7164,7 @@ struct epi_info
 {
   rtx sp_equiv_reg;		/* REG that SP is set from, perhaps SP.  */
   HOST_WIDE_INT sp_offset;	/* Offset from SP_EQUIV_REG of present SP.  */
-  rtx new_sp_equiv_reg;		/* REG to be used at end of insn.   */
+  rtx new_sp_equiv_reg;		/* REG to be used at end of insn.  */
   HOST_WIDE_INT new_sp_offset;	/* Offset to be used at end of insn.  */
   rtx equiv_reg_src;		/* If nonzero, the value that SP_EQUIV_REG
 				   should be set to once we no longer need
@@ -7184,7 +7184,7 @@ keep_stack_depressed (seq)
   int i, j;
   struct epi_info info;
 
-  /* If the epilogue is just a single instruction, it ust be OK as is.   */
+  /* If the epilogue is just a single instruction, it ust be OK as is.  */
 
   if (GET_CODE (seq) != SEQUENCE)
     return seq;
diff --git a/gcc/gcc.c b/gcc/gcc.c
index 65ee5fab0eed6e494bda66f1c67c604fe35e42f6..62202058949100f0a459594fca8a4e06acc3eb28 100644
--- a/gcc/gcc.c
+++ b/gcc/gcc.c
@@ -6019,7 +6019,7 @@ main (argc, argv)
 
   if (target_help_flag)
    {
-      /* Print if any target specific options.*/
+      /* Print if any target specific options.  */
 
       /* We do not exit here. Instead we have created a fake input file
          called 'target-dummy' which needs to be compiled, and we pass this
diff --git a/gcc/genattrtab.c b/gcc/genattrtab.c
index f1f383c31e37d29a6cbfb19bf7b124d6ba874490..1c916b34bf2b8c1c123ba355511c811b44e39cae 100644
--- a/gcc/genattrtab.c
+++ b/gcc/genattrtab.c
@@ -1,6 +1,6 @@
 /* Generate code from machine description to compute values of attributes.
    Copyright (C) 1991, 1993, 1994, 1995, 1996, 1997, 1998,
-   1999, 2000 Free Software Foundation, Inc.
+   1999, 2000, 2002 Free Software Foundation, Inc.
    Contributed by Richard Kenner (kenner@vlsi1.ultra.nyu.edu)
 
 This file is part of GCC.
@@ -231,7 +231,7 @@ struct function_unit
   struct function_unit_op *ops;	/* Pointer to first operation type.  */
   int needs_conflict_function;	/* Nonzero if a conflict function required.  */
   int needs_blockage_function;	/* Nonzero if a blockage function required.  */
-  int needs_range_function;	/* Nonzero if blockage range function needed.*/
+  int needs_range_function;	/* Nonzero if blockage range function needed.  */
   rtx default_cost;		/* Conflict cost, if constant.  */
   struct range issue_delay;	/* Range of issue delay values.  */
   int max_blockage;		/* Maximum time an insn blocks the unit.  */
diff --git a/gcc/gthr-win32.h b/gcc/gthr-win32.h
index f432194f89998c14d7f031b45d316fb07aa82924..31da7a152bc68338100926492a40b0163b08a0aa 100644
--- a/gcc/gthr-win32.h
+++ b/gcc/gthr-win32.h
@@ -1,6 +1,6 @@
 /* Threads compatibility routines for libgcc2 and libobjc.  */
 /* Compile this one with gcc.  */
-/* Copyright (C) 1999, 2000 Free Software Foundation, Inc.
+/* Copyright (C) 1999, 2000, 2002 Free Software Foundation, Inc.
    Contributed by Mumit Khan <khan@xraylith.wisc.edu>.
 
 This file is part of GCC.
@@ -213,7 +213,7 @@ __gthread_objc_thread_get_data(void)
 
   lasterror = GetLastError();
 
-  ptr = TlsGetValue(__gthread_objc_data_tls);          /* Return thread data.      */
+  ptr = TlsGetValue(__gthread_objc_data_tls);          /* Return thread data.  */
 
   SetLastError( lasterror );
 
diff --git a/gcc/haifa-sched.c b/gcc/haifa-sched.c
index 7b9a2e821268e0a217c02a23322e9af2e6a539ae..150cb093e1c121d32463d08a9ce48c437b5c8352 100644
--- a/gcc/haifa-sched.c
+++ b/gcc/haifa-sched.c
@@ -1,6 +1,6 @@
 /* Instruction scheduling pass.
    Copyright (C) 1992, 1993, 1994, 1995, 1996, 1997, 1998,
-   1999, 2000, 2001 Free Software Foundation, Inc.
+   1999, 2000, 2001, 2002 Free Software Foundation, Inc.
    Contributed by Michael Tiemann (tiemann@cygnus.com) Enhanced by,
    and currently maintained by, Jim Wilson (wilson@cygnus.com)
 
@@ -1197,7 +1197,7 @@ rm_line_notes (head, tail)
 }
 
 /* Save line number notes for each insn in block B.  HEAD and TAIL are
-   the boundaries of the block in which notes should be processed.*/
+   the boundaries of the block in which notes should be processed.  */
 
 void
 save_line_notes (b, head, tail)
@@ -1225,7 +1225,7 @@ save_line_notes (b, head, tail)
 
 /* After a block was scheduled, insert line notes into the insns list.
    HEAD and TAIL are the boundaries of the block in which notes should
-   be processed.*/
+   be processed.  */
 
 void
 restore_line_notes (head, tail)
diff --git a/gcc/predict.c b/gcc/predict.c
index c35837ed2b7eb413a462ef2ddb8c9271c31370e3..9c14dbca2267ffc554f3c0ce7c45cfa8ce73ede2 100644
--- a/gcc/predict.c
+++ b/gcc/predict.c
@@ -1,5 +1,5 @@
 /* Branch prediction routines for the GNU compiler.
-   Copyright (C) 2000, 2001 Free Software Foundation, Inc.
+   Copyright (C) 2000, 2001, 2002 Free Software Foundation, Inc.
 
 This file is part of GCC.
 
@@ -25,7 +25,7 @@ Software Foundation, 59 Temple Place - Suite 330, Boston, MA
    [2] "Static Branch Frequency and Program Profile Analysis"
        Wu and Larus; MICRO-27.
    [3] "Corpus-based Static Branch Prediction"
-       Calder, Grunwald, Lindsay, Martin, Mozer, and Zorn; PLDI '95.   */
+       Calder, Grunwald, Lindsay, Martin, Mozer, and Zorn; PLDI '95.  */
 
 
 #include "config.h"
diff --git a/gcc/rtl.h b/gcc/rtl.h
index 76ce3f92db1dfbad1339a8e548f31c6de6f0c330..3147926fc6042c13c27a5518cae347265542e418 100644
--- a/gcc/rtl.h
+++ b/gcc/rtl.h
@@ -875,7 +875,7 @@ extern unsigned int subreg_regno 	PARAMS ((rtx));
 #define MEM_IN_STRUCT_P(RTX) ((RTX)->in_struct)
 
 /* For a MEM rtx, 1 if it refers to a scalar.  If zero, RTX may or may
-   not refer to a scalar.*/
+   not refer to a scalar.  */
 #define MEM_SCALAR_P(RTX) ((RTX)->frame_related)
 
 /* If VAL is non-zero, set MEM_IN_STRUCT_P and clear MEM_SCALAR_P in
diff --git a/gcc/rtlanal.c b/gcc/rtlanal.c
index 3af6da7e78c2d4a4ae60eda5ec68cb3a83779bba..578412361e665f2885e7172a6c04f64b9e9856a8 100644
--- a/gcc/rtlanal.c
+++ b/gcc/rtlanal.c
@@ -301,7 +301,7 @@ rtx_addr_varies_p (x, for_alias)
 /* Return the value of the integer term in X, if one is apparent;
    otherwise return 0.
    Only obvious integer terms are detected.
-   This is used in cse.c with the `related_value' field.*/
+   This is used in cse.c with the `related_value' field.  */
 
 HOST_WIDE_INT
 get_integer_term (x)
diff --git a/gcc/unwind-dw2-fde.h b/gcc/unwind-dw2-fde.h
index 758d3199cf0a879d0c3a6ea6ca32f084ed8ce13b..14552684381bb1b96552d4107eeff550af4eac1a 100644
--- a/gcc/unwind-dw2-fde.h
+++ b/gcc/unwind-dw2-fde.h
@@ -1,5 +1,6 @@
 /* Subroutines needed for unwinding stack frames for exception handling.  */
-/* Copyright (C) 1997, 1998, 1999, 2000, 2001 Free Software Foundation, Inc.
+/* Copyright (C) 1997, 1998, 1999, 2000, 2001, 2002
+   Free Software Foundation, Inc.
    Contributed by Jason Merrill <jason@cygnus.com>.
 
 This file is part of GCC.
@@ -54,7 +55,7 @@ struct object
       unsigned long mixed_encoding : 1;
       unsigned long encoding : 8;
       /* ??? Wish there was an easy way to detect a 64-bit host here;
-	 we've got 32 bits left to play with... */
+	 we've got 32 bits left to play with...  */
       unsigned long count : 21;
     } b;
     size_t i;
diff --git a/gcc/unwind-pe.h b/gcc/unwind-pe.h
index 74c4e2778b244df44f0f053ad0a694f9119661a5..fe0632432d2ed30e4f2009c934253b604171528a 100644
--- a/gcc/unwind-pe.h
+++ b/gcc/unwind-pe.h
@@ -1,5 +1,5 @@
 /* Exception handling and frame unwind runtime interface routines.
-   Copyright (C) 2001 Free Software Foundation, Inc.
+   Copyright (C) 2001, 2002 Free Software Foundation, Inc.
 
    This file is part of GCC.
 
@@ -22,7 +22,7 @@
    compatibility problems with the base ABI.  This is slightly better
    than duplicating code, however.  */
 
-/* If using C++, references to abort have to be qualified with std::. */
+/* If using C++, references to abort have to be qualified with std::.  */
 #if __cplusplus
 #define __gxx_abort std::abort
 #else
diff --git a/gcc/vmsdbgout.c b/gcc/vmsdbgout.c
index da3948bcb3f1a4f22038e110702845b4b26672ec..8b19775ddd0e6a0ba8a8040a43d0092ddf497480 100644
--- a/gcc/vmsdbgout.c
+++ b/gcc/vmsdbgout.c
@@ -72,7 +72,7 @@ dst_file_info_entry;
 #define ASM_COMMENT_START ";#"
 #endif
 
-/* Maximum size (in bytes) of an artificially generated label.   */
+/* Maximum size (in bytes) of an artificially generated label.  */
 #define MAX_ARTIFICIAL_LABEL_BYTES	30
 
 /* Make sure we know the sizes of the various types debug can describe. These
@@ -1331,7 +1331,7 @@ vmsdbgout_end_epilogue ()
   if (debug_info_level > DINFO_LEVEL_NONE)
     {
       /* Output a label to mark the endpoint of the code generated for this
-         function.        */
+         function.  */
       ASM_GENERATE_INTERNAL_LABEL (label, FUNC_END_LABEL,
 				   current_funcdef_number);
       ASM_OUTPUT_LABEL (asm_out_file, label);