Caml1999I031 9.Stdlib__Printf'fprintfW@&Stdlib+out_channel@@@@ &format!a@+out_channel@@@$unitF@@@@@@@@@@@*printf.mliR[[R[@@.@@&printfX@-&format!a@7+out_channel@@@#@@@@@@@@@!"@@NA@'eprintfY@M&format!a@W+out_channel@@@C@@@@@@@@@AVVBV@@nB@'sprintfZ@m&format!a@]@@@&stringO@@@@@@@@@bc@@C@'bprintf[@&Buffer!t@@@@&format!a@&Buffer!t@@@@@@@@@@@@@@@@D@(ifprintf\@!b@@'format4!a@!c@@@@@@@@@@@@rrr@@E@(ibprintf]@&Buffer!t@@@@&format!a@&Buffer!t@@@@@@@@@@@@@@:::v@@ F@(kfprintf^@@ +out_channel@@@!d@@@@+out_channel@@@@'format4!a@ʠ(+out_channel@@@Ƞ@@@Ǡ"@@@@@@@@@@@@u@@@G@)ikfprintf_@@!b@!d@@@@ @M'format4!a@Ӡ!c@Р@@@ @@@@@@@= G G> G @@jH@(ksprintf`@@@@@!d@@@@u'format4!a@ݠe@@@۠@@@ڠ@@@@@@@@i!!j!!^@@I@(kbprintfa@@&Buffer!t@@@!d@@@@&Buffer!t@@@@'format4!a@&Buffer!t@@@@@@&@@@@@@@@@@!!" "=@@J@)ikbprintfb@@&Buffer!t@@@!d@@@@&Buffer!t@@@@'format4!a@&Buffer!t@@@@@@&@@@@@@@@@@""##8@@ K@'kprintfc@@@@@!b@@@@'format4!a@@@@@@@@@@@@@@@ ## #$@@8L@@#j.Stdlib__Printf0=iW1jfSW<-Stdlib__Uchar0 |K?bޣ ˠ+Stdlib__Seq0yt\eǟ&Q,}.Stdlib__Either0 }rCT0J){9).Stdlib__Buffer0'ON͋[h#ڗA&Stdlib0>,W:(8CamlinternalFormatBasics0cEXyR[f@б@г+out_channelHR[iIR[t@@ @@@J@@б@г!&formatWR[XR[@А!a@A@_cR[ydR[{@@г7+out_channelmR[}nR[@@ @@@o@@гԠ$unit{R[|R[@@ @@@}@@@1' @@@R[x1@@А!a/R[R[@@@4@@ @@@J@@M@@@R[[ @)ocaml.doc E [fprintf outchan format arg1 ... argN] formats the arguments [arg1] to [argN] according to the format string [format], and outputs the resulting string on the channel [outchan]. The format string is a character string which contains two types of objects: plain characters, which are simply copied to the output channel, and conversion specifications, each of which causes conversion and printing of arguments. Conversion specifications have the following form: [% [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 two characters. The types and their meanings are: - [d], [i]: convert an integer argument to signed decimal. The flag [#] adds underscores to large values for readability. - [u], [n], [l], [L], or [N]: convert an integer argument to unsigned decimal. Warning: [n], [l], [L], and [N] are used for [scanf], and should not be used for [printf]. The flag [#] adds underscores to large values for readability. - [x]: convert an integer argument to unsigned hexadecimal, using lowercase letters. The flag [#] adds a [0x] prefix to non zero values. - [X]: convert an integer argument to unsigned hexadecimal, using uppercase letters. The flag [#] adds a [0X] prefix to non zero values. - [o]: convert an integer argument to unsigned octal. The flag [#] adds a [0] prefix to non zero values. - [s]: insert a string argument. - [S]: convert a string argument to OCaml syntax (double quotes, escapes). - [c]: insert a character argument. - [C]: convert a character argument to OCaml syntax (single quotes, escapes). - [f]: convert a floating-point argument to decimal notation, in the style [dddd.ddd]. - [F]: convert a floating-point argument to OCaml syntax ([dddd.] or [dddd.ddd] or [d.ddd e+-dd]). Converts to hexadecimal with the [#] flag (see [h]). - [e] or [E]: convert a floating-point argument to decimal notation, in the style [d.ddd e+-dd] (mantissa and exponent). - [g] or [G]: convert a floating-point argument to decimal notation, in style [f] or [e], [E] (whichever is more compact). Moreover, any trailing zeros are removed from the fractional part of the result and the decimal-point character is removed if there is no fractional part remaining. - [h] or [H]: convert a floating-point argument to hexadecimal notation, in the style [0xh.hhhh p+-dd] (hexadecimal mantissa, exponent in decimal and denotes a power of 2). - [B]: convert a boolean argument to the string [true] or [false] - [b]: convert a boolean argument (deprecated; do not use in new programs). - [ld], [li], [lu], [lx], [lX], [lo]: convert an [int32] argument to the format specified by the second letter (decimal, hexadecimal, etc). - [nd], [ni], [nu], [nx], [nX], [no]: convert a [nativeint] argument to the format specified by the second letter. - [Ld], [Li], [Lu], [Lx], [LX], [Lo]: convert an [int64] argument to the format specified by the second letter. - [a]: user-defined printer. Take two arguments and apply the first one to [outchan] (the current output channel) and to the second argument. The first argument must therefore have type [out_channel -> 'b -> unit] and the second ['b]. The output produced by the function is inserted in the output of [fprintf] at the current point. - [t]: same as [%a], but take only one argument (with type [out_channel -> unit]) and apply it to [outchan]. - [\{ fmt %\}]: convert a format string argument to its type digest. The argument must have the same type as the internal format string [fmt]. - [( fmt %)]: format string substitution. Take a format string argument and substitute it to the internal format string [fmt] to print following arguments. The argument must have the same type as the internal format string [fmt]. - [!]: take no argument and flush the output. - [%]: take no argument and output one [%] character. - [\@]: take no argument and output one [\@] character. - [,]: take no argument and output nothing: a no-op delimiter for conversion specifications. The optional [flags] are: - [-]: left-justify the output (default is right justification). - [0]: for numerical conversions, pad with zeroes instead of spaces. - [+]: for signed numerical conversions, prefix number with a [+] sign if positive. - space: for signed numerical conversions, prefix number with a space if positive. - [#]: request an alternate formatting style for the integer types and the floating-point type [F]. The optional [width] is an integer indicating the minimal width of the result. For instance, [%6d] prints an integer, prefixing it with spaces to fill at least 6 characters. The optional [precision] is a dot [.] followed by an integer indicating how many digits follow the decimal point in the [%f], [%e], [%E], [%h], and [%H] conversions or the maximum number of significant digits to appear for the [%F], [%g] and [%G] conversions. For instance, [%.4f] prints a [float] with 4 fractional digits. The integer in a [width] or [precision] can also be specified as [*], in which case an extra integer argument is taken to specify the corresponding [width] or [precision]. This integer argument precedes immediately the argument to print. For instance, [%.*f] prints a [float] with as many fractional digits as the value of the argument given before the float. S@@@@@@@@@@&printf @б@г&format@А!a@A@0@4@A@@г+out_channel@@ @@@@@г;$unit @@ @@@ @@@3) @@@'3@@А!a1,@@@6@@1 @@@@d 4 Same as {!Printf.fprintf}, but output on [stdout]. T@@@@@@@A@@D'eprintf VZVa@б@г&formatV|V@А!a@A@0&%%&&&&&@c~2@A,Ve-Vg@@г+out_channel6Vi7Vt@@ @@@@@г$unitDVvEVz@@ @@@ @@@3) @@@'QVd3@@А!a1,VVWV@@@6@@1 @@@]VV@Ɛ 4 Same as {!Printf.fprintf}, but output on [stderr]. ij@@@@@@@B@@D'sprintf uv@б@гJ&format@А!a@A@0@c~2@A@@г$unit@@ @@@@@г&string@@ @@@ @@@3) @@@'3@@А!a1,@@@6@@1 @@@@( Same as {!Printf.fprintf}, but instead of printing on an output channel, return a string containing the result of formatting the arguments. ?@@@@@@@C@@D'bprintf7@б@г&Buffer!t@@ @@@o0@`{/@A@@б@г&format@А!a@zA@p@@г&Buffer!t@@ @@@q*@@гv$unit@@ @@@r8@@@4* @@@v?*4@@А!a2D/0@@@7@@wI @@@O@@xLR@@@9 @ Same as {!Printf.fprintf}, but instead of printing on an output channel, append the formatted arguments to the given extensible buffer (see module {!Buffer}). EFSp@@@@@@@]D@@_(ifprintf8QrvRr~@б@А!b@A@{0ZYYZZZZZ@t(@A`rar@@б@г5'format4krlr@А!a@A@|wrxr@@А!b% ~rr@@А!c@A@},rr@@г$unitrr@@ @@@~<@@@6,F @@@Dr7@@А!a5Irr@@@:@@N @@@V@@QO@@@rr @ Same as {!Printf.fprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 3.10.0 68@@@@@@@E@@d(ibprintf9:>:F@б@г&Buffer!t:I:Q@@ @@@0@/@A@@б@г&format:j:p@А!a@A@:V:X@@г&Buffer!t:Z:b@@ @@@*@@гh$unit:d:h@@ @@@8@@@4* @@@?:U4@@А!a2D!:t":v@@@7@@I @@@O@@LR@@@+:: @ Same as {!Printf.bprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11.0 7ww8@@@@@@@OF@@_M 0 Formatted output functions with continuations. H  I >@@@@@@0GFFGGGGG@o#@A(kfprintf:T@DU@L@б@б@г++out_channela@Pb@[@@ @@@@@А!d@A@%p@_q@a@@@ @@*@@б@гH+out_channel~@f@q@@ @@@9@@б@гW'format4uu@А!a@A@Nuu@@гm+out_channeluu@@ @@@^@@г $unituu@@ @@@l@@А!dQquu@@@8.Z@@@{u9@@А!a7uu@@@<@@ @@@R@@U@@@c@@@O @@@@@@B Same as [fprintf], but instead of returning immediately, passes the out channel to its first argument at the end of printing. @since 3.09.0  C E@@@@@@@G@@)ikfprintf; G K G T@б@б@А!b@A@0@*@A G X G Z@@А!d@A@   G ^ G `@@@ @@@@б@А!b G e G g@@б@г'format4# G |$ G @А!a@A@// G l0 G n@@А!b;66 G p7 G r@@А!c@A@BB G tC G v@@А!dAII G xJ G z@@@/%UJ@@@SS G k0@@А!a.XX G Y G @@@3@@] @@@e@@`H@@@S@@cc G W @@@f G G@ϐ Same as [kfprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.01.0 r  s!!@@@@@@@H@@w(ksprintf<~!!!!%@б@б@г蠐&string!!)!!/@@ @@@0@.@A@@А!d@A@ !!3!!5@@@ @@@@б@гt'format4!!Q!!X@А!a@A@%!!;!!=@@г$unit!!?!!C@@ @@@5@@г+&string!!E!!K@@ @@@C@@А!dBH!!M!!O@@@8.K@@@R!!:9@@А!a7W!!\!!^@@@<@@\ @@@Q@@_!!(@@@!! @\ t Same as [sprintf] above, but instead of returning the string, passes it to the first argument. @since 3.09.0 !_!_!!@@@@@@@I@@s(kbprintf= !! !!@б@б@г&Buffer!t!!!!@@ @@@0@1@A@@А!d@A@ ,!!-!!@@@ @@@@б@г&Buffer!t=!!>!"@@ @@@"@@б@г'format4L" "0M" "7@А!a@A@7X" "Y" "@@г-&Buffer!te" "f" "$@@ @@@J@@г̠$units" "&t" "*@@ @@@X@@А!dW]~" "," ".@@@;1`@@@g" "<@@А!a:l" ";" "=@@@?@@q @@@U@@tX@@@i@@w!! @@@!!@ Same as [bprintf], but instead of returning immediately, passes the buffer to its first argument at the end of printing. @since 3.10.0 ">">""@@@@@@@J@@)ikbprintf>""""@б@б@г&Buffer!t""""@@ @@@0@1@A@@А!d@A@ """"@@@ @@@@б@г&Buffer!t""""@@ @@@"@@б@г'format4##+##2@А!a@A@7####@@г&Buffer!t ####@@ @@@J@@гt$unit##!##%@@ @@@X@@А!dW]&##''##)@@@;1`@@@g0##<@@А!a:l5##66##8@@@?@@q @@@U@@tX@@@i@@w@"" @@@C""@ Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11.0 O#9#9P##@@@@@@@gK@@e, Deprecated `##a##@@@@@@0_^^_____@#@A'kprintf?l##m##@б@б@г֠&stringy##z##@@ @@@@@А!b@A@%####@@@ @@*@@б@г`'format4#$#$@А!a@A@?####@@г$unit#$#$@@ @@@O@@г&string#$#$ @@ @@@]@@А!bBb#$#$@@@8.K@@@l##9@@А!a7q#$#$@@@<@@v @@@Q@@y##@@@## @H & A deprecated synonym for [ksprintf]. $ $ $ $K@@@@@@@L@@@\@F@@:@&@L@8@(@@@l@X@,@@0@.@A@ H************************************************************************A@@A@L@ H BMMBM@ H OCaml CC@ H !D"D3@ H Xavier Leroy and Pierre Weis, projet Cristal, INRIA Rocquencourt 'E44(E4@ H -F.F@ H Copyright 1996 Institut National de Recherche en Informatique et 3G4G@ H en Automatique. 9H:Hg@ H ?Ihh@Ih@ H All rights reserved. This file is distributed under the terms of EJFJ@ H the GNU Lesser General Public License version 2.1, with the KKLKN@ H special exception on linking described in the file LICENSE. QLOORLO@ H WMXM@ H************************************************************************]N^N5@>* Formatted output functions. c F* [fprintf outchan format arg1 ... argN] formats the arguments [arg1] to [argN] according to the format string [format], and outputs the resulting string on the channel [outchan]. The format string is a character string which contains two types of objects: plain characters, which are simply copied to the output channel, and conversion specifications, each of which causes conversion and printing of arguments. Conversion specifications have the following form: [% [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 two characters. The types and their meanings are: - [d], [i]: convert an integer argument to signed decimal. The flag [#] adds underscores to large values for readability. - [u], [n], [l], [L], or [N]: convert an integer argument to unsigned decimal. Warning: [n], [l], [L], and [N] are used for [scanf], and should not be used for [printf]. The flag [#] adds underscores to large values for readability. - [x]: convert an integer argument to unsigned hexadecimal, using lowercase letters. The flag [#] adds a [0x] prefix to non zero values. - [X]: convert an integer argument to unsigned hexadecimal, using uppercase letters. The flag [#] adds a [0X] prefix to non zero values. - [o]: convert an integer argument to unsigned octal. The flag [#] adds a [0] prefix to non zero values. - [s]: insert a string argument. - [S]: convert a string argument to OCaml syntax (double quotes, escapes). - [c]: insert a character argument. - [C]: convert a character argument to OCaml syntax (single quotes, escapes). - [f]: convert a floating-point argument to decimal notation, in the style [dddd.ddd]. - [F]: convert a floating-point argument to OCaml syntax ([dddd.] or [dddd.ddd] or [d.ddd e+-dd]). Converts to hexadecimal with the [#] flag (see [h]). - [e] or [E]: convert a floating-point argument to decimal notation, in the style [d.ddd e+-dd] (mantissa and exponent). - [g] or [G]: convert a floating-point argument to decimal notation, in style [f] or [e], [E] (whichever is more compact). Moreover, any trailing zeros are removed from the fractional part of the result and the decimal-point character is removed if there is no fractional part remaining. - [h] or [H]: convert a floating-point argument to hexadecimal notation, in the style [0xh.hhhh p+-dd] (hexadecimal mantissa, exponent in decimal and denotes a power of 2). - [B]: convert a boolean argument to the string [true] or [false] - [b]: convert a boolean argument (deprecated; do not use in new programs). - [ld], [li], [lu], [lx], [lX], [lo]: convert an [int32] argument to the format specified by the second letter (decimal, hexadecimal, etc). - [nd], [ni], [nu], [nx], [nX], [no]: convert a [nativeint] argument to the format specified by the second letter. - [Ld], [Li], [Lu], [Lx], [LX], [Lo]: convert an [int64] argument to the format specified by the second letter. - [a]: user-defined printer. Take two arguments and apply the first one to [outchan] (the current output channel) and to the second argument. The first argument must therefore have type [out_channel -> 'b -> unit] and the second ['b]. The output produced by the function is inserted in the output of [fprintf] at the current point. - [t]: same as [%a], but take only one argument (with type [out_channel -> unit]) and apply it to [outchan]. - [\{ fmt %\}]: convert a format string argument to its type digest. The argument must have the same type as the internal format string [fmt]. - [( fmt %)]: format string substitution. Take a format string argument and substitute it to the internal format string [fmt] to print following arguments. The argument must have the same type as the internal format string [fmt]. - [!]: take no argument and flush the output. - [%]: take no argument and output one [%] character. - [\@]: take no argument and output one [\@] character. - [,]: take no argument and output nothing: a no-op delimiter for conversion specifications. The optional [flags] are: - [-]: left-justify the output (default is right justification). - [0]: for numerical conversions, pad with zeroes instead of spaces. - [+]: for signed numerical conversions, prefix number with a [+] sign if positive. - space: for signed numerical conversions, prefix number with a space if positive. - [#]: request an alternate formatting style for the integer types and the floating-point type [F]. The optional [width] is an integer indicating the minimal width of the result. For instance, [%6d] prints an integer, prefixing it with spaces to fill at least 6 characters. The optional [precision] is a dot [.] followed by an integer indicating how many digits follow the decimal point in the [%f], [%e], [%E], [%h], and [%H] conversions or the maximum number of significant digits to appear for the [%F], [%g] and [%G] conversions. For instance, [%.4f] prints a [float] with 4 fractional digits. The integer in a [width] or [precision] can also be specified as [*], in which case an extra integer argument is taken to specify the corresponding [width] or [precision]. This integer argument precedes immediately the argument to print. For instance, [%.*f] prints a [float] with as many fractional digits as the value of the argument given before the float.  5* Same as {!Printf.fprintf}, but output on [stdout]. b 5* Same as {!Printf.fprintf}, but output on [stderr].  * Same as {!Printf.fprintf}, but instead of printing on an output channel, return a string containing the result of formatting the arguments.  * Same as {!Printf.fprintf}, but instead of printing on an output channel, append the formatted arguments to the given extensible buffer (see module {!Buffer}). - * Same as {!Printf.fprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 3.10.0  * Same as {!Printf.bprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11.0 A 1* Formatted output functions with continuations. 3 * Same as [fprintf], but instead of returning immediately, passes the out channel to its first argument at the end of printing. @since 3.09.0  * Same as [kfprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.01.0  u* Same as [sprintf] above, but instead of returning the string, passes it to the first argument. @since 3.09.0  * Same as [bprintf], but instead of returning immediately, passes the buffer to its first argument at the end of printing. @since 3.10.0 ࠠ * Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11.0 ;-* Deprecated - '* A deprecated synonym for [ksprintf]. @T)../ocamlc0-strict-sequence(-absname"-w8+a-4-9-41-42-44-45-48-70"-g+-warn-error"+A*-bin-annot)-nostdlib*-principal,-safe-string/-strict-formats"-w"+A"-w.-fragile-match"-o2stdlib__Printf.cmi"-c 1/home/barsac/ci/builds/workspace/bootstrap/stdlib @0"$FgהF0@@@8CamlinternalFormatBasics0cEXy,W:(.Stdlib__Buffer0'ON͋[h#ڗA.Stdlib__Either0 }rCT0J){9)֐0=iW1jfSW<+Stdlib__Seq0yt\eǟ&Q,}-Stdlib__Uchar0 |K?bޣ @0=iW1jfSW