Caml1999I037S]:&,Stdlib__Bool!t";@@%false@@(bool.mliV{V{@@A@$true@@ V{ V{@@B@@@A$boolE@@@@@@@V{{ @@A@$@@A@#not#@@@@@@@@@@']dd(]dz@@7C@@"&&$@#@@@@)@@@-@@@@@@@ϐ(%sequandBA @@@@F`G`@@VD@@"||%@B@@@@H@@@L@@@@@@@Ԑ'%sequorBA@@@@deee@@tE@@&logand&@`@@@@f@@@j@@@@@@@@}j~j@@F@@%logor'@y@@@@@@@@@@@@@@@mm(@@G@@&logxor(@@@@@@@@@@@@@@@@pwwpw@@H@@%equal)@@@@@@@@@@@@@@@@u  u  2@@I@@'compare*@@@@@@@@#intA@@@@@@@@y  y  @@J@@&to_int+@@@@@@@@@@ 6 6 6 N@@K@@(to_float,@@@@%floatD@@@@@@ B   B  @@L@@)to_string-@@@@&stringQ@@@@@@ K  !K  @@0M@@+seeded_hash.@N@@@@"@@@X@@@@@@@@9O  :O  7@@IN@@$hash/@5@@@k@@@@@@LV  MV  )@@\O@@@j:.,Stdlib__Bool0@Gko:ݠ&Stdlib0Lku]8_٠8CamlinternalFormatBasics0%FU(Q/Tu@@@Caml1999T0377W!C,Stdlib__Bool*ocaml.text&_none_@@A " Boolean values. @since 4.08 (bool.mliP77RL^@@@@@@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@A4 {1:bools Booleans} T``T`y@@@@@@A+!tAV{V{@@;@@%false@@V{V{@@A@$true@@V{V{@@B@@@A@@@@@@@V{{ @)ocaml.docڐ The type of booleans (truth values). The constructors [false] and [true] are included here so that they have paths, but they are not intended to be used in user-defined data types. W[_b@@@@@@@A@@@@#++)(@'@@@+@#''V{%@$@@@(@@Aг$$boolV{V{@@,3@I;@@@AQ@@@@@@@@31@@!@A @@42 10@00@@@0@0@@?G@#not]dh]dk@б@гϠ$bool]dn]dr@@ @@@3@ys@A@@гޠ$bool)]dv*]dz@@ @@@@@@@@@@@4]dd @l ) [not b] is the boolean negation of [b]. A^{{B^{@@@@@@@ZC@@@|U@@@@@@1"&&X`Y`@б@г$boolc`d`@@ @@@3eddeeeee@J_8@A@@б@г)$boolt`u`@@ @@@@@г6$bool``@@ @@@@@@@@!@@@'@@$* @@(%sequandBA @@@@``@ΐ [e0 && e1] is the lazy boolean conjunction of expressions [e0] and [e1]. If [e0] evaluates to [false], [e1] is not evaluated. Right-associative operator at precedence level 3/11. acw@@@@@@@D@@@@@@@@@K"||ee@б@г{$boolee@@ @@@3@dy@@A@@б@г$boolee@@ @@@@@г$boolee@@ @@@@@@@@!@@@'@@$* @@'%sequorBAc@@@@ee@0 [e0 || e1] is the lazy boolean disjunction of expressions [e0] and [e1]. If [e0] evaluates to [true], [e1] is not evaluated. Right-associative operator at precedence level 2/11. fhl@@@@@@@E@@@A@@@@@@J&logandjj@б@гݠ$bool(j)j@@ @@@3*))*****@cx?@A@@б@г$bool9j:j@@ @@@@@г$boolFjGj@@ @@@@@@@@!@@@'@@$* @@@Tj@ H [logand b1 b2] is [true] if and only if [b1] and [b2] are both [true]. akbk@@@@@@@zF@@@u@@@@@@C%logorxm ym@б@г8$boolmm@@ @@@3@\q8@A@@б@гI$boolmm @@ @@@@@гV$boolm$m(@@ @@@@@@@@!@@@'@@$* @@@m@琠 G [logor b1 b2] is [true] if and only if either [b1] or [b2] is [true]. n))n)u@@@@@@@G@@@А@@@@@@C&logxorpw{pw@б@г$boolpwpw@@ @@@3@\q8@A@@б@г$boolpwpw@@ @@@@@г$boolpwpw@@ @@@@@@@@!@@@'@@$* @@@ pww@B E [logxor b1 b2] is [true] if exactly one of [b1] and [b2] is [true]. qq@@@@@@@0H@@@R+@@@@@@C98 & {1:preds Predicates and comparisons} 5s6s @@@@@@343344444@Uj1@A%equalAu  Bu  @б@г$boolLu  Mu  "@@ @@@@@б@г$bool[u  &\u  *@@ @@@)@@г$boolhu  .iu  2@@ @@@6@@@@@9@@@%@@<( @@@vu  @ [ [equal b0 b1] is [true] if and only if [b0] and [b1] are both [true] or both [false]. v 3 3w | @@@@@@@I@@@@@@@@@['comparey  y  @б@гZ$booly  y  @@ @@@3@to8@A@@б@гk$booly  y  @@ @@@@@г#inty  y  @@ @@@@@@@@!@@@'@@$* @@@y  @ Y [compare b0 b1] is a total order on boolean values. [false] is smaller than [true]. z  {  @@@@@@@J@@@򐠠@@@@@@C8 {1:convert Converting} }  }  4@@@@@@3@Uj1@A&to_int 6 :  6 @@б@гȠ$bool 6 C 6 G@@ @@@@@г#int  6 K! 6 N@@ @@@'@@@@@*@@@+ 6 6 @c ? [to_int b] is [0] if [b] is [false] and [1] if [b] is [true]. 8@ O O9@ O @@@@@@@QK@@@sL@@@@@@I(to_floatOB  PB  @б@г$boolZB  [B  @@ @@@3\[[\\\\\@b]8@A@@г$%floatiB  jB  @@ @@@@@@@@@@@tB   @ C [to_float b] is [0.] if [b] is [false] and [1.] if [b] is [true]. C  C  @@@@@@@L@@@@@@@@@1)to_stringK  K  @б@гX$boolK  K  @@ @@@3@J_8@A@@гy&stringK  K  @@ @@@@@@@@@@@K   @ Q [to_string b] is ["true"] if [b] is [true] and ["false"] if [b] is [false]. L  M  @@@@@@@M@@@ސ@@@@@@1+seeded_hash O  O  "@б@г#intO  %O  (@@ @@@3@J_8@A@@б@г$boolO  ,O  0@@ @@@@@гݠ#int O  4 O  7@@ @@@@@@@@!@@@'@@$* @@@O  @P A seeded hash function for booleans, with the same output value as {!Hashtbl.seeded_hash}. This function allows this module to be passed as argument to the functor {!Hashtbl.MakeSeeded}. @since 5.1 %P 8 8&T  @@@@@@@>N@@@`9@@@@@@C$hash!<V  =V  @б@г$boolGV  HV  "@@ @@@3IHHIIIII@\q8@A@@г)#intVV  &WV  )@@ @@@@@@@@@@@aV   @ An unseeded hash function for booleans, with the same output value as {!Hashtbl.hash}. This function allows this module to be passed as argument to the functor {!Hashtbl.Make}. @since 5.1 nW * *o[  @@@@@@@O@@@@@@@@@1@A@vO@/@@n5@@@P@@h@H!@@@a:@@3@Nc<@A@ H************************************************************************A@@A@L@ H BMMBM@ H OCaml CC@ H DD3@ H The OCaml programmers E44E4@ H FF@ H Copyright 2018 Institut National de Recherche en Informatique et GG@ H en Automatique. HHg@ H IhhIh@ H All rights reserved. This file is distributed under the terms of JJ@ H the GNU Lesser General Public License version 2.1, with the KKN@ H special exception on linking described in the file LICENSE. LOOLO@ H MM@ H************************************************************************NN5@ #* Boolean values. @since 4.08 5* {1:bools Booleans} U!*V{V{@ * The type of booleans (truth values). The constructors [false] and [true] are included here so that they have paths, but they are not intended to be used in user-defined data types. ( ** [not b] is the boolean negation of [b].  * [e0 && e1] is the lazy boolean conjunction of expressions [e0] and [e1]. If [e0] evaluates to [false], [e1] is not evaluated. Right-associative operator at precedence level 3/11. b * [e0 || e1] is the lazy boolean disjunction of expressions [e0] and [e1]. If [e0] evaluates to [true], [e1] is not evaluated. Right-associative operator at precedence level 2/11.  I* [logand b1 b2] is [true] if and only if [b1] and [b2] are both [true].  H* [logor b1 b2] is [true] if and only if either [b1] or [b2] is [true]. R F* [logxor b1 b2] is [true] if exactly one of [b1] and [b2] is [true].  '* {1:preds Predicates and comparisons} ߠ \* [equal b0 b1] is [true] if and only if [b0] and [b1] are both [true] or both [false].  Z* [compare b0 b1] is a total order on boolean values. [false] is smaller than [true]. <9* {1:convert Converting} ! @* [to_int b] is [0] if [b] is [false] and [1] if [b] is [true]. 蠠 D* [to_float b] is [0.] if [b] is [false] and [1.] if [b] is [true].  val of_string : string -> bool option (** [of_string s] is [Some true] if [s] is ["true"], [Some false] if [s] is ["false"] and [None] otherwise. *) &E  'I  @ R* [to_string b] is ["true"] if [b] is [true] and ["false"] if [b] is [false]. b * A seeded hash function for booleans, with the same output value as {!Hashtbl.seeded_hash}. This function allows this module to be passed as argument to the functor {!Hashtbl.MakeSeeded}. @since 5.1  * An unseeded hash function for booleans, with the same output value as {!Hashtbl.hash}. This function allows this module to be passed as argument to the functor {!Hashtbl.Make}. @since 5.1 @?)../ocamlc0-strict-sequence(-absname"-w5+a-4-9-41-42-44-45-48"-g+-warn-error"+A*-bin-annot)-nostdlib*-principal"-o0stdlib__Bool.cmi"-c?@ Z/home/teraram/ci/builds/workspace/parallel-build/flambda/true/label/ocaml-manycores/stdlib @@0YޕuTƠ9> 3DCCDDDDD@B@@8CamlinternalFormatBasics0%FU(Q/Tu&Stdlib0Lku]8_٠j0@Gko:@0@Gko:APC֐ @@˰ܐ@+L@@@d@@T.h@@@@=u@@R@@@P@@