summaryrefslogtreecommitdiffstats
path: root/stdlib/printf.mli
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/printf.mli')
-rw-r--r--stdlib/printf.mli4
1 files changed, 2 insertions, 2 deletions
diff --git a/stdlib/printf.mli b/stdlib/printf.mli
index 942ec49b0..6fcb45eba 100644
--- a/stdlib/printf.mli
+++ b/stdlib/printf.mli
@@ -27,7 +27,7 @@ val fprintf : out_channel -> ('a, out_channel, unit) format -> 'a
Conversion specifications have the following form:
- [% \[flags\] \[width\] \[.precision\] type]
+ [% [flags] [width] [.precision] type]
In short, a conversion specification consists in the [%] character,
followed by optional modifiers and a type which is made of one or
@@ -159,7 +159,7 @@ val kprintf : (string -> 'a) -> ('b, unit, string, 'a) format4 -> 'b;;
(**/**)
-(* For OCaml system internal use only. Don't call directly. *)
+(* The following is for system use only. Do not call directly. *)
module CamlinternalPr : sig