Skip to content

Commit ed05748

Browse files
committed
Order type variables in format parameters
(Maxence Guesdon) git-svn-id: http://caml.inria.fr/svn/ocaml/trunk@16310 f963ae5c-01c2-4b8c-9fe0-0dff7051ff02
1 parent 0b1575a commit ed05748

File tree

1 file changed

+8
-8
lines changed

1 file changed

+8
-8
lines changed

stdlib/printf.mli

+8-8
Original file line numberDiff line numberDiff line change
@@ -127,41 +127,41 @@ val bprintf : Buffer.t -> ('a, Buffer.t, unit) format -> 'a
127127
append the formatted arguments to the given extensible buffer
128128
(see module {!Buffer}). *)
129129

130-
val ifprintf : 'a -> ('b, 'a, 'c, unit) format4 -> 'b
130+
val ifprintf : 'b -> ('a, 'b, 'c, unit) format4 -> 'a
131131
(** Same as {!Printf.fprintf}, but does not print anything.
132132
Useful to ignore some material when conditionally printing.
133133
@since 3.10.0
134134
*)
135135

136136
(** Formatted output functions with continuations. *)
137137

138-
val kfprintf : (out_channel -> 'a) -> out_channel ->
139-
('b, out_channel, unit, 'a) format4 -> 'b
138+
val kfprintf : (out_channel -> 'd) -> out_channel ->
139+
('a, out_channel, unit, 'd) format4 -> 'a
140140
(** Same as [fprintf], but instead of returning immediately,
141141
passes the out channel to its first argument at the end of printing.
142142
@since 3.09.0
143143
*)
144144

145-
val ikfprintf : ('a -> 'b) -> 'a -> ('c, 'a, 'd, 'b) format4 -> 'c
145+
val ikfprintf : ('b -> 'd) -> 'b -> ('a, 'b, 'c, 'd) format4 -> 'a
146146
(** Same as [kfprintf] above, but does not print anything.
147147
Useful to ignore some material when conditionally printing.
148148
@since 4.0
149149
*)
150150

151-
val ksprintf : (string -> 'a) -> ('b, unit, string, 'a) format4 -> 'b
151+
val ksprintf : (string -> 'd) -> ('a, unit, string, 'd) format4 -> 'a
152152
(** Same as [sprintf] above, but instead of returning the string,
153153
passes it to the first argument.
154154
@since 3.09.0
155155
*)
156156

157-
val kbprintf : (Buffer.t -> 'a) -> Buffer.t ->
158-
('b, Buffer.t, unit, 'a) format4 -> 'b
157+
val kbprintf : (Buffer.t -> 'd) -> Buffer.t ->
158+
('a, Buffer.t, unit, 'd) format4 -> 'a
159159
(** Same as [bprintf], but instead of returning immediately,
160160
passes the buffer to its first argument at the end of printing.
161161
@since 3.10.0
162162
*)
163163

164164
(** Deprecated *)
165165

166-
val kprintf : (string -> 'a) -> ('b, unit, string, 'a) format4 -> 'b
166+
val kprintf : (string -> 'b) -> ('a, unit, string, 'b) format4 -> 'a
167167
(** A deprecated synonym for [ksprintf]. *)

0 commit comments

Comments
 (0)