summaryrefslogtreecommitdiffstats
path: root/stdlib/scanf.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/scanf.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/scanf.ml')
-rw-r--r--stdlib/scanf.ml8
1 files changed, 4 insertions, 4 deletions
diff --git a/stdlib/scanf.ml b/stdlib/scanf.ml
index ee80f5e7a..11abe0212 100644
--- a/stdlib/scanf.ml
+++ b/stdlib/scanf.ml
@@ -737,7 +737,7 @@ let scan_exp_part width ib =
;;
(* Scan the integer part of a floating point number, (not using the
- Caml lexical convention since the integer part can be empty):
+ OCaml lexical convention since the integer part can be empty):
an optional sign, followed by a possibly empty sequence of decimal
digits (e.g. -.1). *)
let scan_int_part width ib =
@@ -925,7 +925,7 @@ let scan_backslash_char width ib =
bad_input_escape c
;;
-(* Scan a character (a Caml token). *)
+(* Scan a character (an OCaml token). *)
let scan_Char width ib =
let rec find_start width =
@@ -946,7 +946,7 @@ let scan_Char width ib =
find_start width
;;
-(* Scan a delimited string (a Caml token). *)
+(* Scan a delimited string (an OCaml token). *)
let scan_String width ib =
let rec find_start width =
@@ -979,7 +979,7 @@ let scan_String width ib =
find_start width
;;
-(* Scan a boolean (a Caml token). *)
+(* Scan a boolean (an OCaml token). *)
let scan_bool width ib =
if width < 4 then bad_token_length "a boolean" else
let c = Scanning.checked_peek_char ib in