summaryrefslogtreecommitdiffstats
path: root/stdlib
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib')
-rwxr-xr-xstdlib/Compflags2
-rw-r--r--stdlib/Makefile2
-rw-r--r--stdlib/Makefile.nt2
-rwxr-xr-xstdlib/Makefile.shared2
-rw-r--r--stdlib/StdlibModules2
-rw-r--r--stdlib/arg.ml2
-rw-r--r--stdlib/arg.mli2
-rw-r--r--stdlib/array.ml2
-rw-r--r--stdlib/array.mli2
-rw-r--r--stdlib/arrayLabels.ml2
-rw-r--r--stdlib/arrayLabels.mli2
-rw-r--r--stdlib/buffer.ml2
-rw-r--r--stdlib/buffer.mli2
-rw-r--r--stdlib/callback.ml2
-rw-r--r--stdlib/callback.mli2
-rw-r--r--stdlib/camlinternalLazy.ml2
-rw-r--r--stdlib/camlinternalLazy.mli2
-rw-r--r--stdlib/camlinternalMod.ml2
-rw-r--r--stdlib/camlinternalMod.mli2
-rw-r--r--stdlib/camlinternalOO.ml2
-rw-r--r--stdlib/camlinternalOO.mli2
-rw-r--r--stdlib/char.ml2
-rw-r--r--stdlib/char.mli2
-rw-r--r--stdlib/complex.ml2
-rw-r--r--stdlib/complex.mli2
-rw-r--r--stdlib/digest.ml2
-rw-r--r--stdlib/digest.mli2
-rw-r--r--stdlib/filename.ml2
-rw-r--r--stdlib/filename.mli2
-rw-r--r--stdlib/format.ml2
-rw-r--r--stdlib/format.mli2
-rw-r--r--stdlib/gc.ml2
-rw-r--r--stdlib/gc.mli2
-rw-r--r--stdlib/genlex.ml2
-rw-r--r--stdlib/genlex.mli2
-rw-r--r--stdlib/hashtbl.ml2
-rw-r--r--stdlib/hashtbl.mli2
-rw-r--r--stdlib/header.c2
-rw-r--r--stdlib/headernt.c2
-rw-r--r--stdlib/int32.ml2
-rw-r--r--stdlib/int32.mli2
-rw-r--r--stdlib/int64.ml2
-rw-r--r--stdlib/int64.mli2
-rw-r--r--stdlib/lazy.ml2
-rw-r--r--stdlib/lazy.mli2
-rw-r--r--stdlib/lexing.ml2
-rw-r--r--stdlib/lexing.mli2
-rw-r--r--stdlib/list.ml2
-rw-r--r--stdlib/list.mli2
-rw-r--r--stdlib/listLabels.ml2
-rw-r--r--stdlib/listLabels.mli2
-rw-r--r--stdlib/map.ml2
-rw-r--r--stdlib/map.mli2
-rw-r--r--stdlib/marshal.ml2
-rw-r--r--stdlib/marshal.mli2
-rw-r--r--stdlib/moreLabels.ml2
-rw-r--r--stdlib/moreLabels.mli2
-rw-r--r--stdlib/nativeint.ml2
-rw-r--r--stdlib/nativeint.mli2
-rw-r--r--stdlib/obj.ml2
-rw-r--r--stdlib/obj.mli2
-rw-r--r--stdlib/oo.ml2
-rw-r--r--stdlib/oo.mli2
-rw-r--r--stdlib/parsing.ml2
-rw-r--r--stdlib/parsing.mli2
-rw-r--r--stdlib/pervasives.ml2
-rw-r--r--stdlib/pervasives.mli2
-rw-r--r--stdlib/printexc.ml2
-rw-r--r--stdlib/printexc.mli2
-rw-r--r--stdlib/printf.ml2
-rw-r--r--stdlib/printf.mli2
-rw-r--r--stdlib/queue.ml2
-rw-r--r--stdlib/queue.mli2
-rw-r--r--stdlib/random.ml2
-rw-r--r--stdlib/random.mli2
-rw-r--r--stdlib/scanf.ml2
-rw-r--r--stdlib/scanf.mli2
-rw-r--r--stdlib/set.ml2
-rw-r--r--stdlib/set.mli2
-rw-r--r--stdlib/sort.ml2
-rw-r--r--stdlib/sort.mli2
-rw-r--r--stdlib/stack.ml2
-rw-r--r--stdlib/stack.mli2
-rw-r--r--stdlib/stdLabels.ml2
-rw-r--r--stdlib/stdLabels.mli2
-rw-r--r--stdlib/std_exit.ml2
-rw-r--r--stdlib/stdlib.mllib1
-rw-r--r--stdlib/stream.ml2
-rw-r--r--stdlib/stream.mli2
-rw-r--r--stdlib/string.ml2
-rw-r--r--stdlib/string.mli2
-rw-r--r--stdlib/stringLabels.ml2
-rw-r--r--stdlib/stringLabels.mli2
-rw-r--r--stdlib/sys.mli2
-rw-r--r--stdlib/sys.mlp2
-rw-r--r--stdlib/weak.ml2
-rw-r--r--stdlib/weak.mli2
97 files changed, 0 insertions, 193 deletions
diff --git a/stdlib/Compflags b/stdlib/Compflags
index 80bb1b667..283c7402f 100755
--- a/stdlib/Compflags
+++ b/stdlib/Compflags
@@ -12,8 +12,6 @@
# #
#########################################################################
-# $Id$
-
case $1 in
pervasives.cm[iox]|pervasives.p.cmx) echo ' -nopervasives';;
camlinternalOO.cmi) echo ' -nopervasives';;
diff --git a/stdlib/Makefile b/stdlib/Makefile
index 2c8e06706..2796d2f18 100644
--- a/stdlib/Makefile
+++ b/stdlib/Makefile
@@ -11,8 +11,6 @@
# #
#########################################################################
-# $Id$
-
include Makefile.shared
allopt: stdlib.cmxa std_exit.cmx allopt-$(PROFILING)
diff --git a/stdlib/Makefile.nt b/stdlib/Makefile.nt
index 579391a77..b85622b90 100644
--- a/stdlib/Makefile.nt
+++ b/stdlib/Makefile.nt
@@ -11,8 +11,6 @@
# #
#########################################################################
-# $Id$
-
include Makefile.shared
allopt: stdlib.cmxa std_exit.cmx
diff --git a/stdlib/Makefile.shared b/stdlib/Makefile.shared
index 9f81ef25f..e9d5940a9 100755
--- a/stdlib/Makefile.shared
+++ b/stdlib/Makefile.shared
@@ -11,8 +11,6 @@
# #
#########################################################################
-# $Id$
-
include ../config/Makefile
RUNTIME=../boot/ocamlrun
COMPILER=../ocamlc
diff --git a/stdlib/StdlibModules b/stdlib/StdlibModules
index 926e2cb51..c5c8896ed 100644
--- a/stdlib/StdlibModules
+++ b/stdlib/StdlibModules
@@ -13,8 +13,6 @@
# #
#########################################################################
-# $Id$
-
# This file lists all standard library modules.
# It is used in particular to know what to expunge in toplevels.
diff --git a/stdlib/arg.ml b/stdlib/arg.ml
index 30364f5c4..0602f6103 100644
--- a/stdlib/arg.ml
+++ b/stdlib/arg.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type key = string
type doc = string
type usage_msg = string
diff --git a/stdlib/arg.mli b/stdlib/arg.mli
index d6e0210aa..2164e624c 100644
--- a/stdlib/arg.mli
+++ b/stdlib/arg.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Parsing of command line arguments.
This module provides a general mechanism for extracting options and
diff --git a/stdlib/array.ml b/stdlib/array.ml
index d17582a43..ec633ea1f 100644
--- a/stdlib/array.ml
+++ b/stdlib/array.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Array operations *)
external length : 'a array -> int = "%array_length"
diff --git a/stdlib/array.mli b/stdlib/array.mli
index db1f469d0..6913e2eb6 100644
--- a/stdlib/array.mli
+++ b/stdlib/array.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Array operations. *)
external length : 'a array -> int = "%array_length"
diff --git a/stdlib/arrayLabels.ml b/stdlib/arrayLabels.ml
index 652f4cac4..39b4bde7f 100644
--- a/stdlib/arrayLabels.ml
+++ b/stdlib/arrayLabels.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [ArrayLabels]: labelled Array module *)
include Array
diff --git a/stdlib/arrayLabels.mli b/stdlib/arrayLabels.mli
index 308bfa4e1..03b6224ae 100644
--- a/stdlib/arrayLabels.mli
+++ b/stdlib/arrayLabels.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Array operations. *)
external length : 'a array -> int = "%array_length"
diff --git a/stdlib/buffer.ml b/stdlib/buffer.ml
index 541717ade..ff30f9fcd 100644
--- a/stdlib/buffer.ml
+++ b/stdlib/buffer.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Extensible buffers *)
type t =
diff --git a/stdlib/buffer.mli b/stdlib/buffer.mli
index ce70c983e..c50c98792 100644
--- a/stdlib/buffer.mli
+++ b/stdlib/buffer.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Extensible string buffers.
This module implements string buffers that automatically expand
diff --git a/stdlib/callback.ml b/stdlib/callback.ml
index 5dd789484..34e7304f7 100644
--- a/stdlib/callback.ml
+++ b/stdlib/callback.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Registering OCaml values with the C runtime for later callbacks *)
external register_named_value : string -> Obj.t -> unit
diff --git a/stdlib/callback.mli b/stdlib/callback.mli
index c536bf8d5..de0d18373 100644
--- a/stdlib/callback.mli
+++ b/stdlib/callback.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Registering OCaml values with the C runtime.
This module allows OCaml values to be registered with the C runtime
diff --git a/stdlib/camlinternalLazy.ml b/stdlib/camlinternalLazy.ml
index 042a377c9..5210c0293 100644
--- a/stdlib/camlinternalLazy.ml
+++ b/stdlib/camlinternalLazy.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Internals of forcing lazy values. *)
exception Undefined;;
diff --git a/stdlib/camlinternalLazy.mli b/stdlib/camlinternalLazy.mli
index eef1c9d6f..27f87d14d 100644
--- a/stdlib/camlinternalLazy.mli
+++ b/stdlib/camlinternalLazy.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Run-time support for lazy values.
All functions in this module are for system use only, not for the
casual user. *)
diff --git a/stdlib/camlinternalMod.ml b/stdlib/camlinternalMod.ml
index 36d73bdcf..20a65207f 100644
--- a/stdlib/camlinternalMod.ml
+++ b/stdlib/camlinternalMod.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type shape =
| Function
| Lazy
diff --git a/stdlib/camlinternalMod.mli b/stdlib/camlinternalMod.mli
index bc59f1956..4ec4fde1f 100644
--- a/stdlib/camlinternalMod.mli
+++ b/stdlib/camlinternalMod.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Run-time support for recursive modules.
All functions in this module are for system use only, not for the
casual user. *)
diff --git a/stdlib/camlinternalOO.ml b/stdlib/camlinternalOO.ml
index 1abb7e550..76e25cfbc 100644
--- a/stdlib/camlinternalOO.ml
+++ b/stdlib/camlinternalOO.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
open Obj
(**** Object representation ****)
diff --git a/stdlib/camlinternalOO.mli b/stdlib/camlinternalOO.mli
index f02b02036..afbe61bb9 100644
--- a/stdlib/camlinternalOO.mli
+++ b/stdlib/camlinternalOO.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Run-time support for objects and classes.
All functions in this module are for system use only, not for the
casual user. *)
diff --git a/stdlib/char.ml b/stdlib/char.ml
index 6dafbad2b..15c463542 100644
--- a/stdlib/char.ml
+++ b/stdlib/char.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Character operations *)
external code: char -> int = "%identity"
diff --git a/stdlib/char.mli b/stdlib/char.mli
index 05a8156d3..d1baa64d3 100644
--- a/stdlib/char.mli
+++ b/stdlib/char.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Character operations. *)
external code : char -> int = "%identity"
diff --git a/stdlib/complex.ml b/stdlib/complex.ml
index c52e647cc..6d71d46af 100644
--- a/stdlib/complex.ml
+++ b/stdlib/complex.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Complex numbers *)
type t = { re: float; im: float }
diff --git a/stdlib/complex.mli b/stdlib/complex.mli
index 1bfa8b7bc..645aa9314 100644
--- a/stdlib/complex.mli
+++ b/stdlib/complex.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Complex numbers.
This module provides arithmetic operations on complex numbers.
diff --git a/stdlib/digest.ml b/stdlib/digest.ml
index 38df61a03..aee6cd26c 100644
--- a/stdlib/digest.ml
+++ b/stdlib/digest.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Message digest (MD5) *)
type t = string
diff --git a/stdlib/digest.mli b/stdlib/digest.mli
index efc0a4773..a8d024b3c 100644
--- a/stdlib/digest.mli
+++ b/stdlib/digest.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** MD5 message digest.
This module provides functions to compute 128-bit ``digests'' of
diff --git a/stdlib/filename.ml b/stdlib/filename.ml
index 89a349df3..3edcb927a 100644
--- a/stdlib/filename.ml
+++ b/stdlib/filename.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
let generic_quote quotequote s =
let l = String.length s in
let b = Buffer.create (l + 20) in
diff --git a/stdlib/filename.mli b/stdlib/filename.mli
index 499e8bb29..b275ebbbd 100644
--- a/stdlib/filename.mli
+++ b/stdlib/filename.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Operations on file names. *)
val current_dir_name : string
diff --git a/stdlib/format.ml b/stdlib/format.ml
index 445e82420..9fa4785e0 100644
--- a/stdlib/format.ml
+++ b/stdlib/format.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* A pretty-printing facility and definition of formatters for ``parallel''
(i.e. unrelated or independent) pretty-printing on multiple out channels. *)
diff --git a/stdlib/format.mli b/stdlib/format.mli
index b44f79fad..a594ed54f 100644
--- a/stdlib/format.mli
+++ b/stdlib/format.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Pretty printing.
This module implements a pretty-printing facility to format text
diff --git a/stdlib/gc.ml b/stdlib/gc.ml
index 16a354a35..39bf343db 100644
--- a/stdlib/gc.ml
+++ b/stdlib/gc.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type stat = {
minor_words : float;
promoted_words : float;
diff --git a/stdlib/gc.mli b/stdlib/gc.mli
index 45d882f25..5437ac0a4 100644
--- a/stdlib/gc.mli
+++ b/stdlib/gc.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Memory management control and statistics; finalised values. *)
type stat =
diff --git a/stdlib/genlex.ml b/stdlib/genlex.ml
index 1c6276c9f..36e10d49a 100644
--- a/stdlib/genlex.ml
+++ b/stdlib/genlex.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type token =
Kwd of string
| Ident of string
diff --git a/stdlib/genlex.mli b/stdlib/genlex.mli
index b1098f097..7a34579aa 100644
--- a/stdlib/genlex.mli
+++ b/stdlib/genlex.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** A generic lexical analyzer.
diff --git a/stdlib/hashtbl.ml b/stdlib/hashtbl.ml
index 80a039959..4480f8fce 100644
--- a/stdlib/hashtbl.ml
+++ b/stdlib/hashtbl.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Hash tables *)
external seeded_hash_param : int -> int -> int -> 'a -> int = "caml_hash" "noalloc"
diff --git a/stdlib/hashtbl.mli b/stdlib/hashtbl.mli
index 00d9efca3..bb75751fe 100644
--- a/stdlib/hashtbl.mli
+++ b/stdlib/hashtbl.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Hash tables and hash functions.
Hash tables are hashed association tables, with in-place modification.
diff --git a/stdlib/header.c b/stdlib/header.c
index c82c7bc7f..cb3d9953a 100644
--- a/stdlib/header.c
+++ b/stdlib/header.c
@@ -11,8 +11,6 @@
/* */
/***********************************************************************/
-/* $Id$ */
-
/* The launcher for bytecode executables (if #! is not working) */
#include <stdio.h>
diff --git a/stdlib/headernt.c b/stdlib/headernt.c
index 9972d5d5c..bb04dbea8 100644
--- a/stdlib/headernt.c
+++ b/stdlib/headernt.c
@@ -11,8 +11,6 @@
/* */
/***********************************************************************/
-/* $Id$ */
-
#define STRICT
#define WIN32_LEAN_AND_MEAN
diff --git a/stdlib/int32.ml b/stdlib/int32.ml
index 15237d7f4..e8e55ddc8 100644
--- a/stdlib/int32.ml
+++ b/stdlib/int32.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [Int32]: 32-bit integers *)
external neg : int32 -> int32 = "%int32_neg"
diff --git a/stdlib/int32.mli b/stdlib/int32.mli
index 8bc7384ff..c727b1a94 100644
--- a/stdlib/int32.mli
+++ b/stdlib/int32.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** 32-bit integers.
This module provides operations on the type [int32]
diff --git a/stdlib/int64.ml b/stdlib/int64.ml
index d8b1c3ca3..aa4add5f1 100644
--- a/stdlib/int64.ml
+++ b/stdlib/int64.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [Int64]: 64-bit integers *)
external neg : int64 -> int64 = "%int64_neg"
diff --git a/stdlib/int64.mli b/stdlib/int64.mli
index 1f28f5c49..ab3b81077 100644
--- a/stdlib/int64.mli
+++ b/stdlib/int64.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** 64-bit integers.
This module provides operations on the type [int64] of
diff --git a/stdlib/lazy.ml b/stdlib/lazy.ml
index 6a114245e..590be8fe9 100644
--- a/stdlib/lazy.ml
+++ b/stdlib/lazy.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [Lazy]: deferred computations *)
diff --git a/stdlib/lazy.mli b/stdlib/lazy.mli
index 9d720d2bb..6108a715c 100644
--- a/stdlib/lazy.mli
+++ b/stdlib/lazy.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Deferred computations. *)
type 'a t = 'a lazy_t;;
diff --git a/stdlib/lexing.ml b/stdlib/lexing.ml
index 4d03ec088..53748ad86 100644
--- a/stdlib/lexing.ml
+++ b/stdlib/lexing.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* The run-time library for lexers generated by camllex *)
type position = {
diff --git a/stdlib/lexing.mli b/stdlib/lexing.mli
index a1a069016..6d5406d69 100644
--- a/stdlib/lexing.mli
+++ b/stdlib/lexing.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** The run-time library for lexers generated by [ocamllex]. *)
(** {6 Positions} *)
diff --git a/stdlib/list.ml b/stdlib/list.ml
index aea05b4bf..b7dd8269a 100644
--- a/stdlib/list.ml
+++ b/stdlib/list.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* List operations *)
let rec length_aux len = function
diff --git a/stdlib/list.mli b/stdlib/list.mli
index 855699d05..33a9144d4 100644
--- a/stdlib/list.mli
+++ b/stdlib/list.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** List operations.
Some functions are flagged as not tail-recursive. A tail-recursive
diff --git a/stdlib/listLabels.ml b/stdlib/listLabels.ml
index 62b6e3768..1f0684bfc 100644
--- a/stdlib/listLabels.ml
+++ b/stdlib/listLabels.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [ListLabels]: labelled List module *)
include List
diff --git a/stdlib/listLabels.mli b/stdlib/listLabels.mli
index b4b58045b..8cf651471 100644
--- a/stdlib/listLabels.mli
+++ b/stdlib/listLabels.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** List operations.
Some functions are flagged as not tail-recursive. A tail-recursive
diff --git a/stdlib/map.ml b/stdlib/map.ml
index 78b76b025..5695fa56c 100644
--- a/stdlib/map.ml
+++ b/stdlib/map.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
module type OrderedType =
sig
type t
diff --git a/stdlib/map.mli b/stdlib/map.mli
index a6374dbdf..6dd371b52 100644
--- a/stdlib/map.mli
+++ b/stdlib/map.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Association tables over ordered types.
This module implements applicative association tables, also known as
diff --git a/stdlib/marshal.ml b/stdlib/marshal.ml
index 638f05434..987aced23 100644
--- a/stdlib/marshal.ml
+++ b/stdlib/marshal.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type extern_flags =
No_sharing
| Closures
diff --git a/stdlib/marshal.mli b/stdlib/marshal.mli
index 86e1ebd19..81a643f9e 100644
--- a/stdlib/marshal.mli
+++ b/stdlib/marshal.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Marshaling of data structures.
This module provides functions to encode arbitrary data structures
diff --git a/stdlib/moreLabels.ml b/stdlib/moreLabels.ml
index 3fda7a5b3..d7ac15894 100644
--- a/stdlib/moreLabels.ml
+++ b/stdlib/moreLabels.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [MoreLabels]: meta-module for compatibility labelled libraries *)
module Hashtbl = Hashtbl
diff --git a/stdlib/moreLabels.mli b/stdlib/moreLabels.mli
index a004bdb5b..5037ce484 100644
--- a/stdlib/moreLabels.mli
+++ b/stdlib/moreLabels.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Extra labeled libraries.
This meta-module provides labelized version of the {!Hashtbl},
diff --git a/stdlib/nativeint.ml b/stdlib/nativeint.ml
index 4bba76d56..94c4b9490 100644
--- a/stdlib/nativeint.ml
+++ b/stdlib/nativeint.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [Nativeint]: processor-native integers *)
external neg: nativeint -> nativeint = "%nativeint_neg"
diff --git a/stdlib/nativeint.mli b/stdlib/nativeint.mli
index 7de11ea00..aa788f03c 100644
--- a/stdlib/nativeint.mli
+++ b/stdlib/nativeint.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Processor-native integers.
This module provides operations on the type [nativeint] of
diff --git a/stdlib/obj.ml b/stdlib/obj.ml
index 96de162f6..a6f11586e 100644
--- a/stdlib/obj.ml
+++ b/stdlib/obj.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Operations on internal representations of values *)
type t
diff --git a/stdlib/obj.mli b/stdlib/obj.mli
index 9b66723b2..9a5bd721d 100644
--- a/stdlib/obj.mli
+++ b/stdlib/obj.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Operations on internal representations of values.
Not for the casual user.
diff --git a/stdlib/oo.ml b/stdlib/oo.ml
index 40c8ae6e4..9d00360c7 100644
--- a/stdlib/oo.ml
+++ b/stdlib/oo.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
let copy = CamlinternalOO.copy
external id : < .. > -> int = "%field1"
let new_method = CamlinternalOO.public_method_label
diff --git a/stdlib/oo.mli b/stdlib/oo.mli
index 2a9eb2320..d1e5804f4 100644
--- a/stdlib/oo.mli
+++ b/stdlib/oo.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Operations on objects *)
val copy : (< .. > as 'a) -> 'a
diff --git a/stdlib/parsing.ml b/stdlib/parsing.ml
index a10ffe2c1..b78331152 100644
--- a/stdlib/parsing.ml
+++ b/stdlib/parsing.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* The parsing engine *)
open Lexing
diff --git a/stdlib/parsing.mli b/stdlib/parsing.mli
index f48824599..0532be162 100644
--- a/stdlib/parsing.mli
+++ b/stdlib/parsing.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** The run-time library for parsers generated by [ocamlyacc]. *)
val symbol_start : unit -> int
diff --git a/stdlib/pervasives.ml b/stdlib/pervasives.ml
index 17a1a9c1a..dc767fe48 100644
--- a/stdlib/pervasives.ml
+++ b/stdlib/pervasives.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* type 'a option = None | Some of 'a *)
(* Exceptions *)
diff --git a/stdlib/pervasives.mli b/stdlib/pervasives.mli
index a131063ec..a1356463b 100644
--- a/stdlib/pervasives.mli
+++ b/stdlib/pervasives.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** The initially opened module.
This module provides the basic operations over the built-in types
diff --git a/stdlib/printexc.ml b/stdlib/printexc.ml
index 828557689..428396247 100644
--- a/stdlib/printexc.ml
+++ b/stdlib/printexc.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
open Printf;;
let printers = ref []
diff --git a/stdlib/printexc.mli b/stdlib/printexc.mli
index 93ee5d6d1..829530fac 100644
--- a/stdlib/printexc.mli
+++ b/stdlib/printexc.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Facilities for printing exceptions. *)
val to_string: exn -> string
diff --git a/stdlib/printf.ml b/stdlib/printf.ml
index 567949064..349f6e364 100644
--- a/stdlib/printf.ml
+++ b/stdlib/printf.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
external format_float: string -> float -> string
= "caml_format_float"
external format_int: string -> int -> string
diff --git a/stdlib/printf.mli b/stdlib/printf.mli
index f7dca62d6..d635225ac 100644
--- a/stdlib/printf.mli
+++ b/stdlib/printf.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Formatted output functions. *)
val fprintf : out_channel -> ('a, out_channel, unit) format -> 'a
diff --git a/stdlib/queue.ml b/stdlib/queue.ml
index 388a46c53..214cc524e 100644
--- a/stdlib/queue.ml
+++ b/stdlib/queue.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
exception Empty
(* OCaml currently does not allow the components of a sum type to be
diff --git a/stdlib/queue.mli b/stdlib/queue.mli
index 5dea9244b..354271237 100644
--- a/stdlib/queue.mli
+++ b/stdlib/queue.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** First-in first-out queues.
This module implements queues (FIFOs), with in-place modification.
diff --git a/stdlib/random.ml b/stdlib/random.ml
index 800c62970..64f00da34 100644
--- a/stdlib/random.ml
+++ b/stdlib/random.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Pseudo-random number generator
This is a lagged-Fibonacci F(55, 24, +) with a modified addition
function to enhance the mixing of bits.
diff --git a/stdlib/random.mli b/stdlib/random.mli
index d8ea01e62..90f396f06 100644
--- a/stdlib/random.mli
+++ b/stdlib/random.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Pseudo-random number generators (PRNG). *)
(** {6 Basic functions} *)
diff --git a/stdlib/scanf.ml b/stdlib/scanf.ml
index b619bf8f0..f3a9ea515 100644
--- a/stdlib/scanf.ml
+++ b/stdlib/scanf.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* The run-time library for scanners. *)
(* Scanning buffers. *)
diff --git a/stdlib/scanf.mli b/stdlib/scanf.mli
index 879851436..1026ba6fe 100644
--- a/stdlib/scanf.mli
+++ b/stdlib/scanf.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Formatted input functions. *)
(** {6 Introduction} *)
diff --git a/stdlib/set.ml b/stdlib/set.ml
index 661968be8..262629253 100644
--- a/stdlib/set.ml
+++ b/stdlib/set.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Sets over ordered types *)
module type OrderedType =
diff --git a/stdlib/set.mli b/stdlib/set.mli
index 0f1a3b7c9..22bb455a8 100644
--- a/stdlib/set.mli
+++ b/stdlib/set.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Sets over ordered types.
This module implements the set data structure, given a total ordering
diff --git a/stdlib/sort.ml b/stdlib/sort.ml
index 66546b12b..59c76cb7b 100644
--- a/stdlib/sort.ml
+++ b/stdlib/sort.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Merging and sorting *)
open Array
diff --git a/stdlib/sort.mli b/stdlib/sort.mli
index 4f2a961aa..d5abb79fa 100644
--- a/stdlib/sort.mli
+++ b/stdlib/sort.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Sorting and merging lists.
@deprecated This module is obsolete and exists only for backward
diff --git a/stdlib/stack.ml b/stdlib/stack.ml
index 599b10c8b..4db3d5b43 100644
--- a/stdlib/stack.ml
+++ b/stdlib/stack.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
type 'a t = { mutable c : 'a list }
exception Empty
diff --git a/stdlib/stack.mli b/stdlib/stack.mli
index 2d7a90066..9b468aa6c 100644
--- a/stdlib/stack.mli
+++ b/stdlib/stack.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Last-in first-out stacks.
This module implements stacks (LIFOs), with in-place modification.
diff --git a/stdlib/stdLabels.ml b/stdlib/stdLabels.ml
index 468dd5176..35b25e0b7 100644
--- a/stdlib/stdLabels.ml
+++ b/stdlib/stdLabels.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [StdLabels]: meta-module for labelled libraries *)
module Array = ArrayLabels
diff --git a/stdlib/stdLabels.mli b/stdlib/stdLabels.mli
index a815d35a2..bf9ef6547 100644
--- a/stdlib/stdLabels.mli
+++ b/stdlib/stdLabels.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Standard labeled libraries.
This meta-module provides labelized version of the {!Array},
diff --git a/stdlib/std_exit.ml b/stdlib/std_exit.ml
index c56153738..66d49c994 100644
--- a/stdlib/std_exit.ml
+++ b/stdlib/std_exit.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Ensure that [at_exit] functions are called at the end of every program *)
let _ = do_at_exit()
diff --git a/stdlib/stdlib.mllib b/stdlib/stdlib.mllib
index 91265e5da..b41bc2d93 100644
--- a/stdlib/stdlib.mllib
+++ b/stdlib/stdlib.mllib
@@ -1,7 +1,6 @@
# This file lists all standard library modules
# (in the same order as Makefile.shared).
# It is used in particular to know what to expunge in toplevels.
-# $Id$
Pervasives
Array
diff --git a/stdlib/stream.ml b/stdlib/stream.ml
index 07effd4a1..99d4bb22c 100644
--- a/stdlib/stream.ml
+++ b/stdlib/stream.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* The fields of type t are not mutable to preserve polymorphism of
the empty stream. This is type safe because the empty stream is never
patched. *)
diff --git a/stdlib/stream.mli b/stdlib/stream.mli
index 16e711797..1098a2765 100644
--- a/stdlib/stream.mli
+++ b/stdlib/stream.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Streams and parsers. *)
type 'a t
diff --git a/stdlib/string.ml b/stdlib/string.ml
index f3906f353..fda40b527 100644
--- a/stdlib/string.ml
+++ b/stdlib/string.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* String operations *)
external length : string -> int = "%string_length"
diff --git a/stdlib/string.mli b/stdlib/string.mli
index c248fab18..14f2c82db 100644
--- a/stdlib/string.mli
+++ b/stdlib/string.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** String operations.
Given a string [s] of length [l], we call character number in [s]
diff --git a/stdlib/stringLabels.ml b/stdlib/stringLabels.ml
index 2345d4992..415dbff5d 100644
--- a/stdlib/stringLabels.ml
+++ b/stdlib/stringLabels.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* Module [StringLabels]: labelled String module *)
include String
diff --git a/stdlib/stringLabels.mli b/stdlib/stringLabels.mli
index 59b0eb7c2..8e2e6d379 100644
--- a/stdlib/stringLabels.mli
+++ b/stdlib/stringLabels.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** String operations. *)
external length : string -> int = "%string_length"
diff --git a/stdlib/sys.mli b/stdlib/sys.mli
index 6f3d57978..99d7824a3 100644
--- a/stdlib/sys.mli
+++ b/stdlib/sys.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** System interface. *)
val argv : string array
diff --git a/stdlib/sys.mlp b/stdlib/sys.mlp
index c7271794d..9c851d4fa 100644
--- a/stdlib/sys.mlp
+++ b/stdlib/sys.mlp
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(* WARNING: sys.ml is generated from sys.mlp. DO NOT EDIT sys.ml or
your changes will be lost.
*)
diff --git a/stdlib/weak.ml b/stdlib/weak.ml
index ab0bab0f6..536a42e04 100644
--- a/stdlib/weak.ml
+++ b/stdlib/weak.ml
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Weak array operations *)
type 'a t;;
diff --git a/stdlib/weak.mli b/stdlib/weak.mli
index add9b0abb..a27dea5ce 100644
--- a/stdlib/weak.mli
+++ b/stdlib/weak.mli
@@ -11,8 +11,6 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
-
(** Arrays of weak pointers and hash tables of weak pointers. *)