camlp4: kill some (* $Id$ *)
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@9106 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02master
parent
04783253f2
commit
3a14bd5091
|
@ -18,7 +18,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(** Camlp4 signature repository *)
|
||||
|
||||
|
|
|
@ -18,7 +18,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
module Make (Ast : Sig.Camlp4Ast) = struct
|
||||
open Format;
|
||||
|
|
|
@ -18,7 +18,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
module Make (Camlp4Ast : Sig.Camlp4Ast) : sig
|
||||
open Camlp4Ast;
|
||||
|
|
|
@ -19,7 +19,7 @@
|
|||
*)
|
||||
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
type t = Queue.t string;
|
||||
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
(* *)
|
||||
(****************************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* Authors:
|
||||
* - Daniel de Rauglaudre: initial version
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
(* *)
|
||||
(****************************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* Authors:
|
||||
* - Daniel de Rauglaudre: initial version
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
(* *)
|
||||
(****************************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* Authors:
|
||||
* - Daniel de Rauglaudre: initial version
|
||||
|
|
|
@ -17,7 +17,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* The lexer definition *)
|
||||
|
||||
|
|
|
@ -18,7 +18,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
module Make (Ast : Sig.Camlp4Ast)
|
||||
: Sig.Quotation with module Ast = Ast
|
||||
|
|
|
@ -18,7 +18,7 @@
|
|||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Camlp4;
|
||||
open PreCast.Syntax;
|
||||
|
|
|
@ -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
|
||||
|
|
|
@ -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
|
||||
|
|
|
@ -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. *)
|
||||
|
|
|
@ -14216,7 +14216,7 @@ module B =
|
|||
* - Daniel de Rauglaudre: initial version
|
||||
* - Nicolas Pouillard: refactoring
|
||||
*)
|
||||
(* $Id$ *)
|
||||
|
||||
open Camlp4
|
||||
|
||||
open PreCast.Syntax
|
||||
|
|
|
@ -17,7 +17,7 @@
|
|||
* - Nicolas Pouillard: rewriting in OCaml
|
||||
*)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Camlp4;
|
||||
open Camlp4_config;
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r q_MLast.cmo pa_extend.cmo *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
module P =
|
||||
struct
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Gramext;
|
||||
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r pa_extend.cmo q_MLast.cmo *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
|
||||
|
|
|
@ -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 *)
|
||||
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r q_MLast.cmo *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* FIXME FIXME *)
|
||||
value _loc = Loc.mk "FIXME parserify.ml";
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
type spc =
|
||||
[ SPCterm of (MLast.patt * option MLast.expr)
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open MLast;
|
||||
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r q_MLast.cmo ./pa_extfun.cmo *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
Pcaml.print_interf.val := fun _ -> ();
|
||||
Pcaml.print_implem.val := fun _ -> ();
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Spretty;
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r pa_extend.cmo q_MLast.cmo *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Pa_extend;
|
||||
|
|
|
@ -12,7 +12,7 @@
|
|||
(* ../../../LICENSE. *)
|
||||
(* *)
|
||||
(***********************************************************************)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
|
||||
|
|
|
@ -12,7 +12,7 @@
|
|||
(* ../../../LICENSE. *)
|
||||
(* *)
|
||||
(***********************************************************************)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
value not_impl name x =
|
||||
let desc =
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
(* Copyright 2001 INRIA *)
|
||||
|
||||
(* Extensible Functions *)
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(** Extensible functions.
|
||||
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
(* Copyright 2001 INRIA *)
|
||||
|
||||
type t 'a = { count : int; data : Lazy.t (data 'a) }
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
(* Module [Fstream]: functional streams *)
|
||||
|
||||
|
|
|
@ -12,7 +12,7 @@
|
|||
(* ../../../LICENSE. *)
|
||||
(* *)
|
||||
(***********************************************************************)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Syntax
|
||||
open Lexgen
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
|
||||
value buff = ref (String.create 80);
|
||||
|
|
|
@ -10,7 +10,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
value apply_load () =
|
||||
let i = ref 1 in
|
||||
|
|
|
@ -1,5 +1,5 @@
|
|||
(* camlp4r *)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
exception Error of string and string;
|
||||
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
module Plexer =
|
||||
struct
|
||||
|
|
|
@ -12,7 +12,7 @@
|
|||
(* ../../../LICENSE. *)
|
||||
(* *)
|
||||
(***********************************************************************)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Pcaml;
|
||||
open Format;
|
||||
|
|
|
@ -12,7 +12,7 @@
|
|||
(* ../../../LICENSE. *)
|
||||
(* *)
|
||||
(***********************************************************************)
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Format;
|
||||
open Pcaml;
|
||||
|
|
|
@ -13,7 +13,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
open Stdpp;
|
||||
open Pcaml;
|
||||
|
|
|
@ -9,7 +9,7 @@
|
|||
(* *)
|
||||
(***********************************************************************)
|
||||
|
||||
(* $Id$ *)
|
||||
|
||||
|
||||
datatype 'a option = SOME of 'a | NONE
|
||||
exception Fail of string
|
||||
|
|
Loading…
Reference in New Issue