Caml1999I037 RU.Stdlib__Printf'fprintfa@&Stdlib+out_channel@@@@ &format!a@+out_channel@@@$unitF@@@@@@@@@@@*printf.mliR[[R[@@.@@@&printfb@-&format!a@7+out_channel@@@#@@@@@@@@@!"@@NA@@'eprintfc@M&format!a@W+out_channel@@@C@@@@@@@@@AVVBV@@nB@@'sprintfd@m&format!a@]@@@&stringQ@@@@@@@@@bc@@C@@'bprintfe@&Buffer!t@@@@&format!a@&Buffer!t@@@@@@@@@@@@@@@@D@@(ifprintff@!b@@'format4!a@!c@@@@@@@@@@@@rrr@@E@@(ibprintfg@&Buffer!t@@@@&format!a@&Buffer!t@@@@@@@@@@@@@@888t@@ F@@(kfprintfh@@ +out_channel@@@!d@@@@+out_channel@@@@'format4!a@ʠ(+out_channel@@@Ƞ@@@Ǡ"@@@@@@@@@@<<q@@@G@@)ikfprintfi@@!b@!d@@@@ @M'format4!a@Ӡ!c@Р@@@ @@@@@@@= A A> A @@jH@@(ksprintfj@@@@@!d@@@@u'format4!a@ݠe@@@۠@@@ڠ@@@@@@@@i!!j!!V@@I@@(kbprintfk@@&Buffer!t@@@!d@@@@&Buffer!t@@@@'format4!a@&Buffer!t@@@@@@&@@@@@@@@@@!!!"3@@J@@)ikbprintfl@@&Buffer!t@@@!d@@@@&Buffer!t@@@@'format4!a@&Buffer!t@@@@@@&@@@@@@@@@@"""#,@@ K@@'kprintfm@@@@@!b@@@@'format4!a@@@@@@@@@@@@@@@ ## $$E@0ocaml.deprecated$$$$%@@A@&stringQ;@@ A@@@@@B@@@%bytesC;@@ A@@@@@F@@@%floatD;@@A@@@@@J@@@$boolE;@@%falsec@@T@$trued@@Z@@@A@@@@@[@A@$unitF;@@"()e@@e@@@A@@@@@f@A@ #exnG;@@@A@@@@@j@@@#effH;@@O@A@A@@@@@@s@@@,continuationI;@@Q@@P@B@A@nY@@@@@@@@@%arrayJ;@@R@A@A@@@@@@@@@ $listK;@@S@A"[]f@@@"::g@@@T@@@ @@A@Y@@@@@@@@&optionL;@@V@A$Noneh@@@$Somei@@@@@A@Y@@@@@@@@)nativeintM;@@A@@@@@@@@%int32N;@@A@@@@@@@@%int64O;@@A@@@@@@@@&lazy_tP;@@X@AJA@Y@@@@@@@@5extension_constructorR;@@A@@@@@@@@*floatarrayS;@@A@@@@@@@@&iarrayT;@@Y@A[A@Y@@@@@@@@*atomic_locU;@@Z@AdA@@@@@@@@@.Assert_failure`#@@@@@J@@@@@@@@[@@A=ocaml.warn_on_literal_pattern @ @0Division_by_zero]#@@@A  @+End_of_file\#$@@@A@'FailureY#,@'@@A!$$@0Invalid_argumentX#5@0@@A*$-#-@-Match_failureV#>@@=@9@;@@a@@A;5>4>@)Not_foundZ#O@@@AC=F<F@-Out_of_memoryW#W@@@AKENDN@.Stack_overflow^#_@@@ASMVLV@.Sys_blocked_io_#g@@@A[U^T^@)Sys_error[#o@j@@Ad^g]g@:Undefined_recursive_modulea#x@@w@s@u@@h@@Auoxnx@:Continuation_already_takenb#@@@A}wv@&Stdlib@Ax'fprintfR[_R[f@б@г+out_channelR[iR[t@@ @@@@@б@г!&formatR[R[@А!a@A@R[yR[{@@г7+out_channelR[}R[@@ @@@@@гj$unitR[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@3@@@A@@г+out_channel"#@@ @@@@@гݠ$unit01 @@ @@@ @@@3) @@@'=3@@А!a1,BC@@@6@@1 @@@I@p 4 Same as {!Printf.fprintf}, but output on [stdout]. VWT@@@@@@@oA@@@j@@@@@@P'eprintfmVZnVa@б@г&formatxV|yV@А!a@A@3@o>@AVeVg@@г+out_channelViVt@@ @@@@@гK$unitVvVz@@ @@@ @@@3) @@@'Vd3@@А!a1,VV@@@6@@1 @@@VV@ސ 4 Same as {!Printf.fprintf}, but output on [stderr]. @@@@@@@B@@@ؐ@@@@@@P'sprintf@б@гn&format@А!a@A@3@o>@A@@г$unit@@ @@@@@г֠&string  @@ @@@ @@@3) @@@'3@@А!a1,@@@6@@1 @@@%@L Same as {!Printf.fprintf}, but instead of printing on an output channel, return a string containing the result of formatting the arguments. 23?@@@@@@@KC@@@\F@@@@@@P'bprintf?IJ@б@г&Buffer!tXY@ \]@@@@@@o3_^^_____@rA@A @@б@г&formatno@А!a@zA@pz{@@г &Buffer!t@ @@@@@@q0 @@гH$unit@@ @@@r>@@@:0 @@@vE:@@А!a8J@@@=@@wO @@@U@@xR]@@@ @ސ Same as {!Printf.fprintf}, but instead of printing on an output channel, append the formatted arguments to the given extensible buffer (see module {!Buffer}). Sp@@@@@@@D@@@ؐ@@@@@@q(ifprintf@rvr~@б@А!b@A@{3@4@Arr@@б@г}'format4rr@А!a@A@|rr@@А!b% r r@@А!c@A@},rr@@гˠ$unitrr@@ @@@~<@@@6,F @@@D,r7@@А!a5I1r2r@@@:@@N @@@V@@QO@@@;rr @b Same as {!Printf.fprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 3.10 HI46@@@@@@@aE@@@r\@@@@@@p(ibprintfA_8<`8D@б@г&Buffer!tn8Go8M@ r8Ns8O@@@@@@3uttuuuuu@A@A @@б@г &format8h8n@А!a@A@8T8V@@г#&Buffer!t8X8^@ 8_8`@@@@@@0 @@г^$unit8b8f@@ @@@>@@@:0 @@@E8S:@@А!a8J8r8t@@@=@@O @@@U@@R]@@@88 @ Same as {!Printf.bprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 uu@@@@@@@F@@@@@@@@@q 0 Formatted output functions with continuations. :@@@@@@3@1@A(kfprintfB<@<H@б@б@г+out_channel<L<W@@ @@@@@А!d@A@% <[!<]@@@ @@*@@б@г+out_channel.<b/<m@@ @@@9@@б@г'format4=q>q@А!a@A@NIqJq@@г+out_channelSqTq@@ @@@^@@г$unitaqbq@@ @@@l@@А!dQqlqmq@@@8.Z@@@{vq9@@А!a7{q|q@@@<@@ @@@R@@U@@@c@@<K @@@<<@ Same as [fprintf], but instead of returning immediately, passes the out channel to its first argument at the end of printing. @since 3.09  = ?@@@@@@@G@@@@@@@@@)ikfprintfC A E A N@б@б@А!b@A@3@6@A A R A T@@А!d@A@  A X A Z@@@ @@@@б@А!b A _ A a@@б@гg'format4 A v A }@А!a@A@/ A f A h@@А!b;6 A j A l@@А!c@A@B A n A p@@А!dAI A r A t@@@/%UJ@@@S A e0@@А!a.X A  A @@@3@@] @@@e@@`H@@@S@@c A Q @@@" A A@I Same as [kfprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.01 /  0! !@@@@@@@HH@@@YC@@@@@@(ksprintfDF!!G!!@б@б@г&stringS!!!T!!'@@ @@@3UTTUUUUU@:@A@@А!d@A@ d!!+e!!-@@@ @@@@б@г'format4r!!Is!!P@А!a@A@%~!!3!!5@@г5$unit!!7!!;@@ @@@5@@г`&string!!=!!C@@ @@@C@@А!dBH!!E!!G@@@8.K@@@R!!29@@А!a7W!!T!!V@@@<@@\ @@@Q@@_!! @@@!! @␠ r Same as [sprintf] above, but instead of returning the string, passes it to the first argument. @since 3.09 !W!W!!@@@@@@@I@@@ܐ@@@@@@(kbprintfE!!!!@б@б@гu&Buffer!t!!!!@ !!!!@@@@@@3@C@A @@А!d@A@ !!!!@@@ @@@@б@г&Buffer!t!!!!@ !!!!@@@@@@( @@б@г'format4,!"&-!"-@А!a@A@=8!"9!"@@г&Buffer!tF!"G!"@ J!"K!"@@@@@@V @@г$unitY!"Z!" @@ @@@d@@А!dcid!""e!"$@@@A7l@@@sn!" B@@А!a@xs!"1t!"3@@@E@@} @@@[@@c@@@u@@~!! @@@!!@ Same as [bprintf], but instead of returning immediately, passes the buffer to its first argument at the end of printing. @since 3.10 "4"4""@@@@@@@J@@@@@@@@@)ikbprintfF""""@б@б@г;&Buffer!t""""@ """"@@@@@@3@C@A @@А!d@A@ """"@@@ @@@@б@гc&Buffer!t""""@ """"@@@@@@( @@б@гz'format4"#"#&@А!a@A@="#"# @@г&Buffer!t "#  "#@ "#"#@@@@@@V @@г̠$unit"# "#@@ @@@d@@А!dci*"#+"#@@@A7l@@@s4"#B@@А!a@x9"#*:"#,@@@E@@} @@@[@@c@@@u@@D"" @@@G""@n Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 T#-#-U##@@@@@@@mK@@@~h@@@@@@vu, Deprecated r##s##@@@@@@3qppqqqqq@1@A'kprintfG~####@б@б@гU&string####@@ @@@@@А!b@A@%####@@@ @@*@@б@г0'format4#$#$ @А!a@A@?####@@гk$unit####@@ @@@O@@г&string####@@ @@@]@@А!bBb#$#$@@@8.K@@@l##9@@А!a7q#$#$@@@<@@v @@@Q@@y##@@@##$$E@0ocaml.deprecated$$$$%@* Formatted output functions.  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]. V 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 p * Same as {!Printf.bprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 ᠠ 1* Formatted output functions with continuations. Ơ * Same as [fprintf], but instead of returning immediately, passes the out channel to its first argument at the end of printing. @since 3.09 + * Same as [kfprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.01  s* Same as [sprintf] above, but instead of returning the string, passes it to the first argument. @since 3.09  * Same as [bprintf], but instead of returning immediately, passes the buffer to its first argument at the end of printing. @since 3.10 < * Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 y-* Deprecated ^ '* A deprecated synonym for [ksprintf]. @O)../ocamlc0-strict-sequence(-absname"-w5+a-4-9-41-42-44-45-48"-g+-warn-error"+A*-bin-annot)-nostdlib*-principal"-w"+A"-w.-fragile-match"-o2stdlib__Printf.cmi"-c  D/builds/workspace/precheck/flambda/false/label/ocaml-linux-32/stdlib @@0A _"_6ӎ3        @ @@8CamlinternalFormatBasics0%FU(Q/Tu&Stdlib0Lku]8_٠.Stdlib__Buffer08APF< t..Stdlib__Either0Vy`u~c à 0)5h Ԝ΀Q +Stdlib__Seq0nwzG&amg-Stdlib__Uchar056uf4[_@0)5h Ԝ΀Q AMC@|@=@@P@@@ðX۰6@{@@@ΐ@`@ސS@@W@@@P@@