summaryrefslogtreecommitdiffstats
path: root/stdlib/camlinternalFormatBasics.ml
diff options
context:
space:
mode:
Diffstat (limited to 'stdlib/camlinternalFormatBasics.ml')
-rw-r--r--stdlib/camlinternalFormatBasics.ml3
1 files changed, 2 insertions, 1 deletions
diff --git a/stdlib/camlinternalFormatBasics.ml b/stdlib/camlinternalFormatBasics.ml
index 47e661fe4..e51e4e2ce 100644
--- a/stdlib/camlinternalFormatBasics.ml
+++ b/stdlib/camlinternalFormatBasics.ml
@@ -211,7 +211,6 @@ type block_type =
(* Formatting element used by the Format pretty-printter. *)
type formatting_lit =
- | Open_box of string * block_type * int (* @[ *)
| Close_box (* @] *)
| Close_tag (* @} *)
| Break of string * int * int (* @, | @ | @; | @;<> *)
@@ -227,6 +226,8 @@ type formatting_lit =
type ('a, 'b, 'c, 'd, 'e, 'f) formatting_gen =
| Open_tag : ('a, 'b, 'c, 'd, 'e, 'f) format6 -> (* @{ *)
('a, 'b, 'c, 'd, 'e, 'f) formatting_gen
+ | Open_box : ('a, 'b, 'c, 'd, 'e, 'f) format6 -> (* @[ *)
+ ('a, 'b, 'c, 'd, 'e, 'f) formatting_gen
(***)