summaryrefslogtreecommitdiffstats
diff options
context:
space:
mode:
authorNicolas Pouillard <np@nicolaspouillard.fr>2008-10-27 14:03:15 +0000
committerNicolas Pouillard <np@nicolaspouillard.fr>2008-10-27 14:03:15 +0000
commit3a14bd5091e13c78354da3f61d321069444aecec (patch)
tree8ece43cee83974d9a20a960238f42ed457994cf9
parent04783253f23f2882fb591136b3ee169c3e587671 (diff)
camlp4: kill some (* $Id$ *)
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@9106 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
-rw-r--r--camlp4/Camlp4/Sig.ml2
-rw-r--r--camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.ml2
-rw-r--r--camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.mli2
-rw-r--r--camlp4/Camlp4/Struct/DynLoader.ml2
-rw-r--r--camlp4/Camlp4/Struct/Grammar/Fold.ml2
-rw-r--r--camlp4/Camlp4/Struct/Grammar/Fold.mli2
-rw-r--r--camlp4/Camlp4/Struct/Grammar/Parser.mli2
-rw-r--r--camlp4/Camlp4/Struct/Lexer.mll2
-rw-r--r--camlp4/Camlp4/Struct/Quotation.ml2
-rw-r--r--camlp4/Camlp4Bin.ml2
-rw-r--r--camlp4/Camlp4Top/Rprint.ml2
-rw-r--r--camlp4/Camlp4Top/Top.ml2
-rw-r--r--camlp4/boot/Camlp4.ml2
-rw-r--r--camlp4/boot/camlp4boot.ml2
-rw-r--r--camlp4/mkcamlp4.ml2
-rw-r--r--camlp4/unmaintained/compile/comp_head.ml2
-rw-r--r--camlp4/unmaintained/compile/compile.ml2
-rw-r--r--camlp4/unmaintained/etc/pa_fstream.ml2
-rw-r--r--camlp4/unmaintained/etc/pa_ifdef.ml2
-rw-r--r--camlp4/unmaintained/etc/pa_oop.ml2
-rw-r--r--camlp4/unmaintained/etc/pa_ru.ml2
-rw-r--r--camlp4/unmaintained/etc/parserify.ml2
-rw-r--r--camlp4/unmaintained/etc/parserify.mli2
-rw-r--r--camlp4/unmaintained/etc/pr_depend.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_extend.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_extfun.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_null.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_op.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_op_main.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_rp.ml2
-rw-r--r--camlp4/unmaintained/etc/pr_rp_main.ml2
-rw-r--r--camlp4/unmaintained/etc/q_phony.ml2
-rw-r--r--camlp4/unmaintained/extfold/pa_extfold.ml2
-rw-r--r--camlp4/unmaintained/format/pa_format.ml2
-rw-r--r--camlp4/unmaintained/lefteval/pa_lefteval.ml2
-rw-r--r--camlp4/unmaintained/lib/extfun.ml2
-rw-r--r--camlp4/unmaintained/lib/extfun.mli2
-rw-r--r--camlp4/unmaintained/lib/fstream.ml2
-rw-r--r--camlp4/unmaintained/lib/fstream.mli2
-rw-r--r--camlp4/unmaintained/ocamllex/pa_ocamllex.ml2
-rw-r--r--camlp4/unmaintained/ocpp/ocpp.ml2
-rw-r--r--camlp4/unmaintained/odyl/odyl.ml2
-rw-r--r--camlp4/unmaintained/odyl/odyl_main.mli2
-rw-r--r--camlp4/unmaintained/olabl/pa_olabl.ml2
-rw-r--r--camlp4/unmaintained/scheme/pr_scheme.ml2
-rw-r--r--camlp4/unmaintained/scheme/pr_schp_main.ml2
-rw-r--r--camlp4/unmaintained/sml/pa_sml.ml2
-rw-r--r--camlp4/unmaintained/sml/smllib.sml2
48 files changed, 48 insertions, 48 deletions
diff --git a/camlp4/Camlp4/Sig.ml b/camlp4/Camlp4/Sig.ml
index fc20b06fd..3e7106e73 100644
--- a/camlp4/Camlp4/Sig.ml
+++ b/camlp4/Camlp4/Sig.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
(** Camlp4 signature repository *)
diff --git a/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.ml b/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.ml
index c0c10a14b..fa6deaaad 100644
--- a/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.ml
+++ b/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
module Make (Ast : Sig.Camlp4Ast) = struct
open Format;
diff --git a/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.mli b/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.mli
index 922789153..6c2848332 100644
--- a/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.mli
+++ b/camlp4/Camlp4/Struct/Camlp4Ast2OCamlAst.mli
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
module Make (Camlp4Ast : Sig.Camlp4Ast) : sig
open Camlp4Ast;
diff --git a/camlp4/Camlp4/Struct/DynLoader.ml b/camlp4/Camlp4/Struct/DynLoader.ml
index 5fbd4fbb4..f8e8c22fd 100644
--- a/camlp4/Camlp4/Struct/DynLoader.ml
+++ b/camlp4/Camlp4/Struct/DynLoader.ml
@@ -19,7 +19,7 @@
*)
-(* $Id$ *)
+
type t = Queue.t string;
diff --git a/camlp4/Camlp4/Struct/Grammar/Fold.ml b/camlp4/Camlp4/Struct/Grammar/Fold.ml
index e59d86e3c..6da366f70 100644
--- a/camlp4/Camlp4/Struct/Grammar/Fold.ml
+++ b/camlp4/Camlp4/Struct/Grammar/Fold.ml
@@ -13,7 +13,7 @@
(* *)
(****************************************************************************)
-(* $Id$ *)
+
(* Authors:
* - Daniel de Rauglaudre: initial version
diff --git a/camlp4/Camlp4/Struct/Grammar/Fold.mli b/camlp4/Camlp4/Struct/Grammar/Fold.mli
index f2f4f8745..0b9b22b79 100644
--- a/camlp4/Camlp4/Struct/Grammar/Fold.mli
+++ b/camlp4/Camlp4/Struct/Grammar/Fold.mli
@@ -13,7 +13,7 @@
(* *)
(****************************************************************************)
-(* $Id$ *)
+
(* Authors:
* - Daniel de Rauglaudre: initial version
diff --git a/camlp4/Camlp4/Struct/Grammar/Parser.mli b/camlp4/Camlp4/Struct/Grammar/Parser.mli
index 086c8127a..695982a3d 100644
--- a/camlp4/Camlp4/Struct/Grammar/Parser.mli
+++ b/camlp4/Camlp4/Struct/Grammar/Parser.mli
@@ -13,7 +13,7 @@
(* *)
(****************************************************************************)
-(* $Id$ *)
+
(* Authors:
* - Daniel de Rauglaudre: initial version
diff --git a/camlp4/Camlp4/Struct/Lexer.mll b/camlp4/Camlp4/Struct/Lexer.mll
index 6344993a0..f024fa437 100644
--- a/camlp4/Camlp4/Struct/Lexer.mll
+++ b/camlp4/Camlp4/Struct/Lexer.mll
@@ -17,7 +17,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
(* The lexer definition *)
diff --git a/camlp4/Camlp4/Struct/Quotation.ml b/camlp4/Camlp4/Struct/Quotation.ml
index a55c1e8bf..65202c875 100644
--- a/camlp4/Camlp4/Struct/Quotation.ml
+++ b/camlp4/Camlp4/Struct/Quotation.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
module Make (Ast : Sig.Camlp4Ast)
: Sig.Quotation with module Ast = Ast
diff --git a/camlp4/Camlp4Bin.ml b/camlp4/Camlp4Bin.ml
index 0d8d29ae6..5e9ff0fd4 100644
--- a/camlp4/Camlp4Bin.ml
+++ b/camlp4/Camlp4Bin.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
open Camlp4;
open PreCast.Syntax;
diff --git a/camlp4/Camlp4Top/Rprint.ml b/camlp4/Camlp4Top/Rprint.ml
index f6d15b51a..ff2a7e58c 100644
--- a/camlp4/Camlp4Top/Rprint.ml
+++ b/camlp4/Camlp4Top/Rprint.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
(* There is a few Obj.magic due to the fact that we no longer have compiler
files like Parsetree, Location, Longident but Camlp4_import that wrap them to
diff --git a/camlp4/Camlp4Top/Top.ml b/camlp4/Camlp4Top/Top.ml
index a317469a8..4bb92bdc4 100644
--- a/camlp4/Camlp4Top/Top.ml
+++ b/camlp4/Camlp4Top/Top.ml
@@ -18,7 +18,7 @@
* - Nicolas Pouillard: refactoring
*)
-(* $Id$ *)
+
(* There is a few Obj.magic due to the fact that we no longer have compiler
files like Parsetree, Location, Longident but Camlp4_import that wrap them to
diff --git a/camlp4/boot/Camlp4.ml b/camlp4/boot/Camlp4.ml
index 57104c22e..924f248b6 100644
--- a/camlp4/boot/Camlp4.ml
+++ b/camlp4/boot/Camlp4.ml
@@ -372,7 +372,7 @@ module Sig =
* - Daniel de Rauglaudre: initial version
* - Nicolas Pouillard: refactoring
*)
- (* $Id$ *)
+
(** Camlp4 signature repository *)
(** {6 Basic signatures} *)
(** Signature with just a type. *)
diff --git a/camlp4/boot/camlp4boot.ml b/camlp4/boot/camlp4boot.ml
index f58725c7a..1d471c209 100644
--- a/camlp4/boot/camlp4boot.ml
+++ b/camlp4/boot/camlp4boot.ml
@@ -14216,7 +14216,7 @@ module B =
* - Daniel de Rauglaudre: initial version
* - Nicolas Pouillard: refactoring
*)
- (* $Id$ *)
+
open Camlp4
open PreCast.Syntax
diff --git a/camlp4/mkcamlp4.ml b/camlp4/mkcamlp4.ml
index bdee85c7f..e5853503d 100644
--- a/camlp4/mkcamlp4.ml
+++ b/camlp4/mkcamlp4.ml
@@ -17,7 +17,7 @@
* - Nicolas Pouillard: rewriting in OCaml
*)
-(* $Id$ *)
+
open Camlp4;
open Camlp4_config;
diff --git a/camlp4/unmaintained/compile/comp_head.ml b/camlp4/unmaintained/compile/comp_head.ml
index a8cb0d8bd..cd6234364 100644
--- a/camlp4/unmaintained/compile/comp_head.ml
+++ b/camlp4/unmaintained/compile/comp_head.ml
@@ -1,5 +1,5 @@
(* camlp4r q_MLast.cmo pa_extend.cmo *)
-(* $Id$ *)
+
module P =
struct
diff --git a/camlp4/unmaintained/compile/compile.ml b/camlp4/unmaintained/compile/compile.ml
index 2e0cbd433..b5e6ba5a1 100644
--- a/camlp4/unmaintained/compile/compile.ml
+++ b/camlp4/unmaintained/compile/compile.ml
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
open Gramext;
diff --git a/camlp4/unmaintained/etc/pa_fstream.ml b/camlp4/unmaintained/etc/pa_fstream.ml
index c09b6b775..e5027b580 100644
--- a/camlp4/unmaintained/etc/pa_fstream.ml
+++ b/camlp4/unmaintained/etc/pa_fstream.ml
@@ -1,5 +1,5 @@
(* camlp4r pa_extend.cmo q_MLast.cmo *)
-(* $Id$ *)
+
open Pcaml;
diff --git a/camlp4/unmaintained/etc/pa_ifdef.ml b/camlp4/unmaintained/etc/pa_ifdef.ml
index cbf1f123c..06652630a 100644
--- a/camlp4/unmaintained/etc/pa_ifdef.ml
+++ b/camlp4/unmaintained/etc/pa_ifdef.ml
@@ -1,5 +1,5 @@
(* camlp4r pa_extend.cmo q_MLast.cmo *)
-(* $Id$ *)
+
(* This module is deprecated since version 3.07; use pa_macro.ml instead *)
diff --git a/camlp4/unmaintained/etc/pa_oop.ml b/camlp4/unmaintained/etc/pa_oop.ml
index ecd9d2db2..bb5684ba4 100644
--- a/camlp4/unmaintained/etc/pa_oop.ml
+++ b/camlp4/unmaintained/etc/pa_oop.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
diff --git a/camlp4/unmaintained/etc/pa_ru.ml b/camlp4/unmaintained/etc/pa_ru.ml
index 4ae5db414..1761c5e47 100644
--- a/camlp4/unmaintained/etc/pa_ru.ml
+++ b/camlp4/unmaintained/etc/pa_ru.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
diff --git a/camlp4/unmaintained/etc/parserify.ml b/camlp4/unmaintained/etc/parserify.ml
index 460ea74e5..f0a3be8bb 100644
--- a/camlp4/unmaintained/etc/parserify.ml
+++ b/camlp4/unmaintained/etc/parserify.ml
@@ -1,5 +1,5 @@
(* camlp4r q_MLast.cmo *)
-(* $Id$ *)
+
(* FIXME FIXME *)
value _loc = Loc.mk "FIXME parserify.ml";
diff --git a/camlp4/unmaintained/etc/parserify.mli b/camlp4/unmaintained/etc/parserify.mli
index ece8b8927..c1affdbae 100644
--- a/camlp4/unmaintained/etc/parserify.mli
+++ b/camlp4/unmaintained/etc/parserify.mli
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
type spc =
[ SPCterm of (MLast.patt * option MLast.expr)
diff --git a/camlp4/unmaintained/etc/pr_depend.ml b/camlp4/unmaintained/etc/pr_depend.ml
index 95d73749a..53224daa4 100644
--- a/camlp4/unmaintained/etc/pr_depend.ml
+++ b/camlp4/unmaintained/etc/pr_depend.ml
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
open MLast;
diff --git a/camlp4/unmaintained/etc/pr_extend.ml b/camlp4/unmaintained/etc/pr_extend.ml
index f07026ee7..5f8b6933d 100644
--- a/camlp4/unmaintained/etc/pr_extend.ml
+++ b/camlp4/unmaintained/etc/pr_extend.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/pr_extfun.ml b/camlp4/unmaintained/etc/pr_extfun.ml
index 973d6a2cc..4479bb407 100644
--- a/camlp4/unmaintained/etc/pr_extfun.ml
+++ b/camlp4/unmaintained/etc/pr_extfun.ml
@@ -1,5 +1,5 @@
(* camlp4r q_MLast.cmo ./pa_extfun.cmo *)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/pr_null.ml b/camlp4/unmaintained/etc/pr_null.ml
index 40566f24d..22f3cb74f 100644
--- a/camlp4/unmaintained/etc/pr_null.ml
+++ b/camlp4/unmaintained/etc/pr_null.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
Pcaml.print_interf.val := fun _ -> ();
Pcaml.print_implem.val := fun _ -> ();
diff --git a/camlp4/unmaintained/etc/pr_op.ml b/camlp4/unmaintained/etc/pr_op.ml
index 4566ce7aa..9b2aebcfa 100644
--- a/camlp4/unmaintained/etc/pr_op.ml
+++ b/camlp4/unmaintained/etc/pr_op.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/pr_op_main.ml b/camlp4/unmaintained/etc/pr_op_main.ml
index 526bd5b49..3ea53ba40 100644
--- a/camlp4/unmaintained/etc/pr_op_main.ml
+++ b/camlp4/unmaintained/etc/pr_op_main.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/pr_rp.ml b/camlp4/unmaintained/etc/pr_rp.ml
index b33b762e7..0604b463f 100644
--- a/camlp4/unmaintained/etc/pr_rp.ml
+++ b/camlp4/unmaintained/etc/pr_rp.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/pr_rp_main.ml b/camlp4/unmaintained/etc/pr_rp_main.ml
index 6ac15e53b..534d40732 100644
--- a/camlp4/unmaintained/etc/pr_rp_main.ml
+++ b/camlp4/unmaintained/etc/pr_rp_main.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Spretty;
diff --git a/camlp4/unmaintained/etc/q_phony.ml b/camlp4/unmaintained/etc/q_phony.ml
index 93ccd669c..e49080815 100644
--- a/camlp4/unmaintained/etc/q_phony.ml
+++ b/camlp4/unmaintained/etc/q_phony.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
diff --git a/camlp4/unmaintained/extfold/pa_extfold.ml b/camlp4/unmaintained/extfold/pa_extfold.ml
index 49dd8fc83..aa8e922b1 100644
--- a/camlp4/unmaintained/extfold/pa_extfold.ml
+++ b/camlp4/unmaintained/extfold/pa_extfold.ml
@@ -1,5 +1,5 @@
(* camlp4r pa_extend.cmo q_MLast.cmo *)
-(* $Id$ *)
+
open Pcaml;
open Pa_extend;
diff --git a/camlp4/unmaintained/format/pa_format.ml b/camlp4/unmaintained/format/pa_format.ml
index 22ecc2b78..640a75031 100644
--- a/camlp4/unmaintained/format/pa_format.ml
+++ b/camlp4/unmaintained/format/pa_format.ml
@@ -12,7 +12,7 @@
(* ../../../LICENSE. *)
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
diff --git a/camlp4/unmaintained/lefteval/pa_lefteval.ml b/camlp4/unmaintained/lefteval/pa_lefteval.ml
index 89a179f6e..56ad29794 100644
--- a/camlp4/unmaintained/lefteval/pa_lefteval.ml
+++ b/camlp4/unmaintained/lefteval/pa_lefteval.ml
@@ -12,7 +12,7 @@
(* ../../../LICENSE. *)
(* *)
(***********************************************************************)
-(* $Id$ *)
+
value not_impl name x =
let desc =
diff --git a/camlp4/unmaintained/lib/extfun.ml b/camlp4/unmaintained/lib/extfun.ml
index 7123271a6..4f4cbbd93 100644
--- a/camlp4/unmaintained/lib/extfun.ml
+++ b/camlp4/unmaintained/lib/extfun.ml
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
(* Copyright 2001 INRIA *)
(* Extensible Functions *)
diff --git a/camlp4/unmaintained/lib/extfun.mli b/camlp4/unmaintained/lib/extfun.mli
index 40cc29e71..6d71fc11f 100644
--- a/camlp4/unmaintained/lib/extfun.mli
+++ b/camlp4/unmaintained/lib/extfun.mli
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
(** Extensible functions.
diff --git a/camlp4/unmaintained/lib/fstream.ml b/camlp4/unmaintained/lib/fstream.ml
index 14ab3a3d1..8c3171a87 100644
--- a/camlp4/unmaintained/lib/fstream.ml
+++ b/camlp4/unmaintained/lib/fstream.ml
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
(* Copyright 2001 INRIA *)
type t 'a = { count : int; data : Lazy.t (data 'a) }
diff --git a/camlp4/unmaintained/lib/fstream.mli b/camlp4/unmaintained/lib/fstream.mli
index 12926d99f..723389ac0 100644
--- a/camlp4/unmaintained/lib/fstream.mli
+++ b/camlp4/unmaintained/lib/fstream.mli
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
(* Module [Fstream]: functional streams *)
diff --git a/camlp4/unmaintained/ocamllex/pa_ocamllex.ml b/camlp4/unmaintained/ocamllex/pa_ocamllex.ml
index 94d553646..e1d4a8ef0 100644
--- a/camlp4/unmaintained/ocamllex/pa_ocamllex.ml
+++ b/camlp4/unmaintained/ocamllex/pa_ocamllex.ml
@@ -12,7 +12,7 @@
(* ../../../LICENSE. *)
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Syntax
open Lexgen
diff --git a/camlp4/unmaintained/ocpp/ocpp.ml b/camlp4/unmaintained/ocpp/ocpp.ml
index 7bee8109c..eb2ccdf59 100644
--- a/camlp4/unmaintained/ocpp/ocpp.ml
+++ b/camlp4/unmaintained/ocpp/ocpp.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
value buff = ref (String.create 80);
diff --git a/camlp4/unmaintained/odyl/odyl.ml b/camlp4/unmaintained/odyl/odyl.ml
index 04437f6cf..23b7136c9 100644
--- a/camlp4/unmaintained/odyl/odyl.ml
+++ b/camlp4/unmaintained/odyl/odyl.ml
@@ -10,7 +10,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
value apply_load () =
let i = ref 1 in
diff --git a/camlp4/unmaintained/odyl/odyl_main.mli b/camlp4/unmaintained/odyl/odyl_main.mli
index db4780537..122c9335a 100644
--- a/camlp4/unmaintained/odyl/odyl_main.mli
+++ b/camlp4/unmaintained/odyl/odyl_main.mli
@@ -1,5 +1,5 @@
(* camlp4r *)
-(* $Id$ *)
+
exception Error of string and string;
diff --git a/camlp4/unmaintained/olabl/pa_olabl.ml b/camlp4/unmaintained/olabl/pa_olabl.ml
index f208c220e..285902a14 100644
--- a/camlp4/unmaintained/olabl/pa_olabl.ml
+++ b/camlp4/unmaintained/olabl/pa_olabl.ml
@@ -13,7 +13,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
module Plexer =
struct
diff --git a/camlp4/unmaintained/scheme/pr_scheme.ml b/camlp4/unmaintained/scheme/pr_scheme.ml
index 57f1b4c8c..a9cf348eb 100644
--- a/camlp4/unmaintained/scheme/pr_scheme.ml
+++ b/camlp4/unmaintained/scheme/pr_scheme.ml
@@ -12,7 +12,7 @@
(* ../../../LICENSE. *)
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Pcaml;
open Format;
diff --git a/camlp4/unmaintained/scheme/pr_schp_main.ml b/camlp4/unmaintained/scheme/pr_schp_main.ml
index 54eb03672..4d3a6fb4a 100644
--- a/camlp4/unmaintained/scheme/pr_schp_main.ml
+++ b/camlp4/unmaintained/scheme/pr_schp_main.ml
@@ -12,7 +12,7 @@
(* ../../../LICENSE. *)
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Format;
open Pcaml;
diff --git a/camlp4/unmaintained/sml/pa_sml.ml b/camlp4/unmaintained/sml/pa_sml.ml
index eb20019d3..1808cdea5 100644
--- a/camlp4/unmaintained/sml/pa_sml.ml
+++ b/camlp4/unmaintained/sml/pa_sml.ml
@@ -13,7 +13,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
open Stdpp;
open Pcaml;
diff --git a/camlp4/unmaintained/sml/smllib.sml b/camlp4/unmaintained/sml/smllib.sml
index d0a8468f5..5ecd09378 100644
--- a/camlp4/unmaintained/sml/smllib.sml
+++ b/camlp4/unmaintained/sml/smllib.sml
@@ -9,7 +9,7 @@
(* *)
(***********************************************************************)
-(* $Id$ *)
+
datatype 'a option = SOME of 'a | NONE
exception Fail of string