Caml1999I037  ] &.Stdlib__Printf'fprintfa@&Stdlib+out_channel@@@w@@x@ &format!a@}+out_channel@@@z$unitF@@@y@@@{@@|@@~@@@*printf.mliR[[R[@@2@@@&printfb@1&format!a@;+out_channel@@@%@@@@@@@@@@@#$@@TA@@'eprintfc@S&format!a@]+out_channel@@@G@@@@@@@@@@@EVVFV@@vB@@'sprintfd@u&format!a@c@@@&stringQ@@@@@@@@@@@hi@@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@@@@@@1+out_channel@@@@@@:'format4!a@D+out_channel@@@.@@@&@@@@@@@@@@@@-<<.q@@^G@@)ikfprintfi@@!b@@@!d@@@@@@ @@@q'format4!a@Š!c@@@@@@ @@@@@@@_ A A` A @@H@@(ksprintfj@@@@@@@!d@@@@@@'format4!a@Ҡ@@@Ϡ*@@@Π@@@@@@@@@@!!!!V@@I@@(kbprintfk@@&Buffer!t@@@@@!d@@@@@@&Buffer!t@@@@@@'format4!a@&Buffer!t@@@ݠ@@@ܠ*@@@@@@@@@@@@!!!"3@@J@@)ikbprintfl@@ &Buffer!t@@@@@!d@@@@@@&Buffer!t@@@@@@"'format4!a@-&Buffer!t@@@@@@*@@@@@@@@@@@@"""#,@@HK@@'kprintfm@@@@@@@!b@@@@@@W'format4!a@E@@@@@@@@@@@@@@@@I##J$$E@0ocaml.deprecatedP$$Q$$%@ɠ+Stdlib__Seq0?72#[O.Stdlib__Either0HD ?|>.Stdlib__Buffer0,I[?z&Stdlib0t0VoS%{<F:8CamlinternalFormatBasics0|.e1R$|o@@@Caml1999T037s 8/C.Stdlib__Printf*ocaml.text&_none_@@A= Formatted output functions. *printf.mliP77P7Y@@@@@@3@@@@@@#intA;@@#intA@@@@@;@A@$charB;@@$charA@@@@@A@A@&stringQ;@@&stringA@@@@@G@@@%bytesC;@@%bytesA@@@@@M@@@%floatD;@@%floatA@@@@@S@@@$boolE;@@%falsec@@]@$trued@@c@@@A@@@@@d@A@$unitF;@@"()e@@n@@@A@@@@@o@A@ #exnG;@@@A@@@@@s@@@#effH;@@O@A@A@@@@@@|@@@,continuationI;@@Q@@P@B,continuationA@nY@@@@@@@@@%arrayJ;@@R@A%arrayA@@@@@@@@@ $listK;@@S@A"[]f@@@"::g@@@T@@@ @@A@Y@@@@@@@@&optionL;@@V@A$Noneh@@@$Somei@@@@@A@Y@@@@@@@@)nativeintM;@@)nativeintA@@@@@@@@%int32N;@@%int32A@@@@@@@@%int64O;@@%int64A@@@@@@@@&lazy_tP;@@X@A&lazy_tA@Y@@@@@@@@ 5extension_constructorR;@@5extension_constructorA@@@@@@@@*floatarrayS;@@*floatarrayA@@@@@@@@&iarrayT;@@Y@A&iarrayA@Y@@@@@@@@ *atomic_locU;@@Z@A*atomic_locA@@@@@@ @@@ .Assert_failure`#@@@@@J@@@@@@@@[@@A!=ocaml.warn_on_literal_pattern%@&@0Division_by_zero]#@@@A+ . .@+End_of_file\#$@@@A366@'FailureY#,@'@@A<??@0Invalid_argumentX#5@0@@AE$H#H@-Match_failureV#>@@=@9@;@@a@@AV5Y4Y@)Not_foundZ#O@@@A^=a<a@-Out_of_memoryW#W@@@AfEiDi@.Stack_overflow^#_@@@AnMqLq@.Sys_blocked_io_#g@@@AvUyTy@)Sys_error[#o@j@@A^]@:Undefined_recursive_modulea#x@@w@s@u@@h@@Aon@:Continuation_already_takenb#@@@Awv@&Stdlib@A'fprintfR[_R[f@б@г+out_channelR[iR[t@@ @@@{@@б@г!&formatR[R[@А!a@A@|R[yR[{@@г7+out_channelR[}R[@@ @@@}̰@@г|$unitR[R[@@ @@@~ڰ@@@1' @@@R[x1@@А!a/R[R[@@@@@6@@ @@@N@@ @@Q @@@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@310011111@0@@A78@@г+out_channelAB@@ @@@@@г$unitOP @@ @@@ @@@3) @@@'\3@@А!a1,ab@@@@@8@@3 @@@j @r 4 Same as {!Printf.fprintf}, but output on [stdout]. wxT@@@@@@@A@@@@@@@@@R'eprintfVZVa@б@г&formatV|V@А!a@A@3@q>@AVeVg@@г+out_channelViVt@@ @@@@@гc$unitVvVz@@ @@@ @@@3) @@@'Vd3@@А!a1,VV@@@@@8@@3 @@@VV @␠ 4 Same as {!Printf.fprintf}, but output on [stderr]. @@@@@@@B@@@@@@@@@R'sprintf@б@гv&format  @А!a@A@3@q>@A@@гŠ$unit!"@@ @@@@@г&string/0@@ @@@ @@@3) @@@'<3@@А!a1,AB@@@@@8@@3 @@@J @R Same as {!Printf.fprintf}, but instead of printing on an output channel, return a string containing the result of formatting the arguments. WX?@@@@@@@pC@@@bk@@@@@@R'bprintf?no@б@г&Buffer!t}~@ @@@@@@ 3@tA@A @@б@г&format@А!a@ A@ @@г&Buffer!t@ @@@@@@ 0 @@гd$unit@@ @@@ >@@@:0 @@@ E:@@А!a8J@@@@@ ?@@ Q @@@Y@@  @@ Va @@@@萠 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@@@@@@@@@u(ifprintf@rvr~@б@А!b@ A@ 3        @4@Arr@@б@г'format4rr@А!a@ A@ *r+r@@А!b% 1r2r@@А!c@ A@ ,=r>r@@г렐$unitGrHr@@ @@@ <@@@6,F @@@ DUr7@@А!a5IZr[r@@@@@ <@@ P @@@Z@@  @@ US @@@hrr@p Same as {!Printf.fprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 3.10 uv46@@@@@@@E@@@@@@@@@t(ibprintfA8<8D@б@г&Buffer!t8G8M@ 8N8O@@@@@@ 3@A@A @@б@г&format8h8n@А!a@ "A@ 8T8V@@г5&Buffer!t8X8^@ 8_8`@@@@@@ 0 @@г$unit8b8f@@ @@@ >@@@:0 @@@ E8S:@@А!a8J8r8t@@@@@ ?@@ Q @@@Y@@  @@ Va @@@88@ Same as {!Printf.bprintf}, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11  uu @@@@@@@$F@@@@@@@@@u-, 0 Formatted output functions with continuations. )*:@@@@@@3(''(((((@1@A(kfprintfB5<@6<H@б@б@г+out_channelB<LC<W@@ @@@ #@@А!d@ 9A@ $%Q<[R<]@@@@@ % @@ &,@@б@г+out_channela<bb<m@@ @@@ ';@@б@г'format4pqqq@А!a@ 7A@ (P|q}q@@г+out_channelqq@@ @@@ )`@@г8$unitqq@@ @@@ *n@@А!dSsqq@@@8.\@@@ /}q9@@А!a7qq@@@@@ 0>@@ 1 @@@V@@ 2 @@ 3Y @@@k@@ 4 @@ 5<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@ NA@ :3@6@A A R A T@@А!d@ RA@ ;  A X A Z@@@@@ < @@ =@@б@А!b A _ A a@@б@г'format4 A v A }@А!a@ LA@ >1& A f' A h@@А!b=8- A j. A l@@А!c@ PA@ ?D9 A n: A p@@А!dCK@ A rA A t@@@/%WL@@@ DUJ A e0@@А!a.ZO A P A @@@@@ E5@@ Fa @@@k@@ G @@ HfL @@@[@@ I @@ Jk` A Q@@@c A A@k Same as [kfprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.01 p  q! !@@@@@@@H@@$@{@@@@@@(ksprintfD!!!!@б@б@г[&string!!!!!'@@ @@@ S3@:@A@@А!d@ fA@ T !!+!!-@@@@@ U @@ V@@б@г"'format4!!I!!P@А!a@ dA@ W'!!3!!5@@гo$unit!!7!!;@@ @@@ X7@@г&string!!=!!C@@ @@@ YE@@А!dDJ!!E!!G@@@8.M@@@ ^T!!29@@А!a7Y!!T!!V@@@@@ _>@@ `` @@@W@@ a @@ be!!  @@@!!@ r Same as [sprintf] above, but instead of returning the string, passes it to the first argument. @since 3.09 !W!W!!@@@@@@@(I@@@#@@@@@@(kbprintfE&!!'!!@б@б@г&Buffer!t7!!8!!@ ;!!<!!@@@@@@ g3>==>>>>>@C@A @@А!d@ }A@ h M!!N!!@@@@@ i @@ j@@б@г&Buffer!ta!!b!!@ e!!f!!@@@@@@ k* @@б@г'format4u!"&v!"-@А!a@ {A@ l?!"!"@@г&Buffer!t!"!"@ !"!"@@@@@@ mX @@гF$unit!"!" @@ @@@ nf@@А!dek!""!"$@@@A7n@@@ su!" B@@А!a@z!"1!"3@@@@@ tG@@ u @@@_@@ v @@ wg @@@}@@ x @@ y!!@@@!!@ؐ 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""""@б@б@гo&Buffer!t""""@  "" ""@@@@@@ ~3        @C@A @@А!d@ A@  """"@@@@@  @@ @@б@г&Buffer!t/""0""@ 3""4""@@@@@@ * @@б@г'format4C"#D"#&@А!a@ A@ ?O"#P"# @@г&Buffer!t]"# ^"#@ a"#b"#@@@@@@ X @@г$unitp"#q"#@@ @@@ f@@А!dek{"#|"#@@@A7n@@@ u"#B@@А!a@z"#*"#,@@@@@ G@@  @@@_@@  @@ g @@@}@@  @@ ""@@@""@ Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 #-#-##@@@@@@@K@@$@@@@@@@̐, Deprecated ####@@@@@@3@1@A'kprintfG####@б@б@г&string####@@ @@@ @@А!b@ A@ %####@@@@@  @@ ,@@б@гn'format4 #$ #$ @А!a@ A@ A ## ##@@г$unit ## ##@@ @@@ Q@@г점&string %## &##@@ @@@ _@@А!bDd 0#$ 1#$@@@8.M@@@ n :##9@@А!a7s ?#$ @#$@@@@@ >@@ z @@@W@@  @@  K## @@@ N## O$$E@0ocaml.deprecated U$$ V$$%@* 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].  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  * 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 O * 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 J * Same as [kbprintf] above, but does not print anything. Useful to ignore some material when conditionally printing. @since 4.11 -* Deprecated d '* 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 A B Z/home/teraram/ci/builds/workspace/parallel-build/flambda/true/label/ocaml-manycores/stdlib @@0A _"_6ӎ3 F E E F F F F F@ D@@8CamlinternalFormatBasics0|.e1R$|o&Stdlib0t0VoS%{<F:.Stdlib__Buffer0,I[?z.Stdlib__Either0HD ?|> v0rwOt:=:栠+Stdlib__Seq0?72#[O-Stdlib__Uchar0=H^V9>@0rwOt:=:AMC@B@S@]@f@@lt@ @@@Ԑ@@@@0@@@P@@