summaryrefslogtreecommitdiffstats
path: root/stdlib/printf.ml
diff options
context:
space:
mode:
authorDamien Doligez <damien.doligez-inria.fr>2011-12-21 15:37:54 +0000
committerDamien Doligez <damien.doligez-inria.fr>2011-12-21 15:37:54 +0000
commitcca0035fbb25e0539c85a62b554c5b0abed66062 (patch)
treea3d0f4a8b1eb522c2107d9f920a07857d8080659 /stdlib/printf.ml
parenta85549ccf6b923198293f7335986b9b18417d06b (diff)
continuing to change the name to OCaml
git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@11922 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
Diffstat (limited to 'stdlib/printf.ml')
-rw-r--r--stdlib/printf.ml8
1 files changed, 4 insertions, 4 deletions
diff --git a/stdlib/printf.ml b/stdlib/printf.ml
index afca2034e..5508768dc 100644
--- a/stdlib/printf.ml
+++ b/stdlib/printf.ml
@@ -391,7 +391,7 @@ type positional_specification =
with $n$ being the {\em value} of the integer argument defining [*]; we
clearly cannot statically guess the value of this parameter in the general
case. Put it another way: this means type dependency, which is completely
- out of scope of the Caml type algebra. *)
+ out of scope of the OCaml type algebra. *)
let scan_positional_spec fmt got_spec i =
match Sformat.unsafe_get fmt i with
@@ -430,7 +430,7 @@ let get_index spec n =
| Spec_index p -> p
;;
-(* Format a float argument as a valid Caml lexeme. *)
+(* Format a float argument as a valid OCaml lexeme. *)
let format_float_lexeme =
(* To be revised: this procedure should be a unique loop that performs the
@@ -443,7 +443,7 @@ let format_float_lexeme =
let make_valid_float_lexeme s =
(* Check if s is already a valid lexeme:
in this case do nothing,
- otherwise turn s into a valid Caml lexeme. *)
+ otherwise turn s into a valid OCaml lexeme. *)
let l = String.length s in
let rec valid_float_loop i =
if i >= l then s ^ "." else
@@ -670,7 +670,7 @@ let sprintf fmt = ksprintf (fun s -> s) fmt;;
(* Obsolete and deprecated. *)
let kprintf = ksprintf;;
-(* For Caml system internal use only: needed to implement modules [Format]
+(* For OCaml system internal use only: needed to implement modules [Format]
and [Scanf]. *)
module CamlinternalPr = struct