Caml1999I037  j F.Stdlib__Either!t&;!a@!b@~@B$Left@@*either.mlix  x  @@A@%Right@@ x   x  @@&B@@@A@YY@@@@@@x  @@@@-@@A@$left'@!a@8!b@@@@@@@+| G G,| G b@@FC@@%right(@!b@!a@ @@@@@@C  D  @@^D@@'is_left)@-!a@!b@@@@$boolE@@@@@@aB  bB  @@|E@@(is_right*@K!a@!b@@@@@@@@@@}E % %~E % F@@F@@(get_left+@g!a@!b@@@@ @@@H  H  @@G@@)get_right,@!a@!b@@@@@@@O 5 5O 5 U@@H@@)find_left-@!a@!b@@@@&optionL@@@@@@V  V  @@I@@*find_right.@!a@!b@@@@ @@@@@@Y O OY O w@@J@@(map_left/@@"a1@"a2@@@@ߠ !b@@@@ @@@@@@@@\  \  @@)K@@)map_right0@@"b1@"b2@@@@!a@@@@  @@@@@@@@3`YY4`Y@@NL@@#map1$left@"a1@"a2@@@%right@"b1@"b2@@@@9@@@>@@@@@@@@@@ddeeD@@M@@$fold2$left@!a@!c@@@%right@!b@@@@f @@@@@@@@@@ii@@N@@'retract3@v!a@ɠ@@@@@@m]]m]{@@O@@$iter4$left@!a@$unitF@@@@@%right@!b@@@@@@@@@@@@@@@@@@@@rr@@P@@'for_all5$left@!a@@@@@@%right@!b@@@@@@@ؠ@@@@@@@@@@@@@v~~v~@@Q@@%equal6$left@!a@@@@@@@@@%right@!b@@@@@@@@@@ @@@@&@@@@@@@@@@@@@@@=z66>|{@@XR@@'compare7$left@!a@@#intA@@@@@@@%right@!b@@@@@@@@@@I!@@@@P(@@@$@@@@@@@@@@@@zDD{@@S@@@l:..Stdlib__Either0Vy`u~c à&Stdlib0Lku]8_٠8CamlinternalFormatBasics0%FU(Q/Tu@@@Caml1999T037U 51MC.Stdlib__Either*ocaml.text&_none_@@A  Either type. Either is the simplest and most generic sum/variant type: a value of [('a, 'b) Either.t] is either a [Left (v : 'a)] or a [Right (v : 'b)]. It is a natural choice in the API of generic functions where values could fall in two different cases, possibly at different types, without assigning a specific meaning to what each case should be. For example: {[List.partition_map: ('a -> ('b, 'c) Either.t) -> 'a list -> 'b list * 'c list]} If you are looking for a parametrized type where one alternative means success and the other means failure, you should use the more specific type {!Result.t}. @since 4.12 *either.mliP77d@@@@@@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@AA+!tAx  x  @А!a@3@;@@@@@B@A@GG@BB@@@x  x  @)ocaml.docǐ X A value of [('a, 'b) Either.t] contains either a value of ['a] or a value of ['b] y  z  E@@@@@@@@@@@@Ax  x  @@BAА!b@.x  x  @@ @;6 @B$Left@B@@@x  x  @@A@%RightB@@@x  ;@@B@@@A@YY@@@@@@B?@@/@#x  @@А!a [x  @@@@ @#x  x  @@А!b!hx  Z@@@@!@@A@\YXW@WW@@@W@W@@gf@$left#| G K$| G O@б@А!a@B@3,++,,,,,@+[@A2| G R3| G T@@г!t;| G a<| G b@А!aB| G YC| G [@@А!b@B@N| G ]O| G _@@@) @@@&V| G X@@@/ @@*(@@@\| G G!@7 [left v] is [Left v]. i} c cj} c @@@@@@@C@@1@}@@@@@@I%right    @б@А!b@B@3@^o4@A    @@г!t    @А!a@B@    @@А!b#    @@@*@@@&  @@@/ @@*(@@@  !@9 [right v] is [Right v]. @  @  @@@@@@@D@@1@ڐ@@@@@@I'is_leftB  B  @б@гM!tB  B  @А!a@B@3@hy>@AB  B  @@А!b@B@B  B  @@@# @@@ B  "@@гǠ$boolB  B  @@ @@@$@@@@@'@@@B   @h ? [is_left (Left v)] is [true], [is_left (Right v)] is [false]. *C  +C  #@@@@@@@CE@@@x>@@@@@@F(is_rightAE % )BE % 1@б@г!tLE % =ME % >@А!a@B@3TSSTTTTT@e>@AZE % 5[E % 7@@А!b@B@fE % 9gE % ;@@@# @@@nE % 4"@@г+$boolvE % BwE % F@@ @@@$@@@@@'@@@E % % @̐ A [is_right (Left v)] is [false], [is_right (Right v)] is [true]. F G GF G @@@@@@@F@@@@@@@@@F(get_leftH  H  @б@г!tH  H  @А!a@B@3@e>@AH  H  @@А!b@B@H  H  @@@# @@@H  "@@А!a H  H  @@@%@@  @@@H  @)  [get_left e] is [v] if [e] is [Left v] and raise otherwise. @raise Invalid_argument if [e] is [Right _]. @since 5.4 I  M " 3@@@@@@@G@@@9@@@@@@?)get_rightO 5 9O 5 B@б@гr!t O 5 NO 5 O@А!a@B@3@^y>@AO 5 FO 5 H@@А!b@B@'O 5 J(O 5 L@@@# @@@/O 5 E"@@А!b4O 5 S5O 5 U@@@@@  @@@;O 5 5@ [get_right e] is [v] if [e] is [Right v] and raise otherwise. @raise Invalid_argument if [e] is [Left _]. @since 5.4 HP V VIT  @@@@@@@aH@@@\@@@@@@?)find_left_V  `V  @б@гϠ!tjV  kV  @А!a@B@3rqqrrrrr@^y>@AxV  yV  @@А!b@B@V  V  @@@# @@@V  "@@г蠐&optionV  V  @А!a*%V  V  @@@0@@@, @@@@@/@@@V  @򐠠 C [find_left (Left v)] is [Some v], [find_left (Right _)] is [None] W  W  M@@@@@@@I@@#@Ȑ@@@@@@N*find_rightY O SY O ]@б@г;!tY O iY O j@А!a@B@3@m>@AY O aY O c@@А!b@B@Y O eY O g@@@# @@@Y O `"@@гT&optionY O qY O w@А!b%Y O nY O p@@@"@@@, @@@@@/@@@Y O O@^ E [find_right (Right v)] is [Some v], [find_right (Left _)] is [None]  Z x x!Z x @@@@@@@9J@@#@n4@@@@@@N(map_left7\  8\  @б@б@А"a1@B@3BAABBBBB@e6@AH\  I\  @@А"a2@B@ S\  T\  @@@ @@ @@б@гƠ!ta\  b\  @А"a1'"h\  i\  @@А!b@B@ .t\  u\  @@@9 @@@ 6|\  @@г預!t\  \  @А"a2=E\  \  @@А!b#L\  \  @@@J*@@@T\  @@@' @@X"@@@K@@[\  @@@\   @ T [map_left f e] is [Left (f v)] if [e] is [Left v] and [e] if [e] is [Right _]. ]  ^4W@@@@@@@K@@0@Ő@@@@@@{)map_right`Y]`Yf@б@б@А"b1@(B@3@6@A`Yj`Ym@@А"b2@*B@ `Yq`Yt@@@ @@@@б@гW!t`Y`Y@А!a@&B@'`Yz`Y|@@А"b13.`Y~`Y@@@:@@@6 `Yy@@гz!t`Y`Y@А!a#E`Y`Y@@А"b2DL#`Y$`Y@@@0K@@@"T+`Y@@@' @@#X"@@@K@@$[2`Yi@@@5`YY @ V [map_right f e] is [Right (f v)] if [e] is [Right v] and [e] if [e] is [Left _]. BaCb@@@@@@@[L@@0@V@@@@@@{#mapYdZd@б$leftб@А"a1@;B@+3feefffff@8@Aleme@@А"a2@=B@, we xe @@@ @@-@@б%rightб@А"b1@?B@.!ee@@А"b2@AB@/,e e#@@@ @@01@@б@г !te3e4@А"a1FAe)e,@@А"b1,He.e1@@@S3@@@3Pe(@@г'!teCeD@А"a2W_e9e<@@А"b2?fe>eA@@@dF@@@6ne8@@@' @@7r"@@`F@@8ue@@i@@9ye!@@@d$@1 h [map ~left ~right (Left v)] is [Left (left v)], [map ~left ~right (Right v)] is [Right (right v)]. fEEgy@@@@@@@ M@@4@A@@@@@@$fold  i i@б$leftб@А!a@NB@B3@8@Aii@@А!c@RB@C (i)i@@@ @@D@@б%rightб@А!b@PB@E!<i=i@@А!c'BiCi@@@$@@F, @@б@г!tPiQi@А!aA<WiXi@@А!b'C^i_i@@@N.@@@IKfi@@А!cHPkili@@@M@@JU @@C.@@KXsi@@hL@@L\wi @@@zi@Ő _ [fold ~left ~right (Left v)] is [left v], and [fold ~left ~right (Right v)] is [right v]. jk)[@@@@@@@N@@@@@@@@@|'retract!m]am]h@б@г!tm]tm]u@А!a@YB@S3@>@Am]lm]n@@А!a m]pm]r@@@@@@Vm]k@@А!am]ym]{@@@ @@W @@@m]]@ L [retract (Left v)] is [v], and [retract (Right v)] is [v]. @since 5.4 n||p@@@@@@@O@@@-󐠠@@@@@@:$iter"rr@б$leftб@А!a@hB@Z3@Sn8@A r r@@г$unitrr@@ @@@[@@@@@\@@б%rightб@А!b@jB@]#*r+r@@гנ$unit3r4r@@ @@@^2@@@@@_5@@б@г!tErFr@А!aJELrMr@@А!b.LSr Tr @@@W5@@@bT[r@@г$unitcrdr@@ @@@cb@@@@@de@@Q5@@ehor @@xZ@@flsr@@@vr@ _ [iter ~left ~right (Left v)] is [left v], and [iter ~left ~right (Right v)] is [right v]. stJ|@@@@@@@P@@#@@@@@@@'for_all#v~v~@б$leftб@А!a@yB@k3@8@Av~v~@@гk$boolv~v~@@ @@@l@@@@@m@@б%rightб@А!b@{B@n#v~v~@@г$boolv~v~@@ @@@o2@@@@@p5@@б@гN!tv~v~@А!aJEv~v~@@А!b.Lv~v~@@@W5@@@sTv~@@г$bool v~ v~@@ @@@tb@@@@@ue@@Q5@@vh v~ @@xZ@@wl v~@@@ v~~@e e [for_all ~left ~right (Left v)] is [left v], and [for_all ~left ~right (Right v)] is [right v].  'w (x4@@@@@@@ @Q@@#@u ;@@@@@@%equal$ >z6: ?z6?@б$leftб@А!a@B@|3 K J J K K K K K@8@A Q{BJ R{BL@@б@А!a  Y{BP Z{BR@@г $bool b{BV c{BZ@@ @@@}@@@!@@~@@@$@@ @@б%rightб@А!b@B@. }{Bf ~{Bh@@б@А!b 6 {Bl {Bn@@г C$bool {Br {Bv@@ @@@E@@@@@H@@@"@@K @@б@г!t |{ |{@А!a`[ |{~ |{@@А!b9b |{ |{@@@m@@@@j |{}@@б@г(!t |{ |{@А!a{ |{ |{@@А!bY |{ |{@@@`@@@ |{@@г $bool |{ |{@@ @@@@@@@@@@@9@@4 @@X@@ {B_@@@@ {BD@@@ z66@B [equal ~left ~right e0 e1] tests equality of [e0] and [e1] using [left] and [right] to respectively compare values wrapped by [Left _] and [Right _].  } 1B@@@@@@@ R@@&@R @@@@@@'compare% DH DO@б$leftб@А!a@B@3 ( ' ' ( ( ( ( (@8@A .RZ /R\@@б@А!a  6R` 7Rb@@г #int ?Rf @Ri@@ @@@@@@!@@@@@$@@ @@б%rightб@А!b@B@. ZRu [Rw@@б@А!b 6 bR{ cR}@@г >#int kR lR@@ @@@E@@@@@H@@@"@@K @@б@г堐!t  @А!a`[  @@А!b9b  @@@m@@@@j @@б@г !t  @А!a{  @@А!bY  @@@`@@@ @@г #int  @@ @@@@@@@@@@@9@@4 @@X@@ Rn@@@@ RT@@@ DD@  [compare ~left ~right e0 e1] totally orders [e0] and [e1] using [left] and [right] to respectively compare values wrapped by [Left _ ] and [Right _]. [Left _] values are smaller than [Right _] values.   I@@@@@@@ S@@&@ / @@@@@@@ [ A@@z?@@{@[ @@[@;@b@B@$@@r<@@z@@B@@3        @D@A@ H************************************************************************ A@@ A@L@ H  BMM !BM@ H OCaml  &C 'C@ H  ,D -D3@ H Gabriel Scherer, projet Parsifal, INRIA Saclay  2E44 3E4@ H  8F 9F@ H Copyright 2019 Institut National de Recherche en Informatique et  >G ?G@ H en Automatique.  DH EHg@ H  JIhh KIh@ H All rights reserved. This file is distributed under the terms of  PJ QJ@ H the GNU Lesser General Public License version 2.1, with the  VK WKN@ H special exception on linking described in the file LICENSE.  \LOO ]LO@ H  bM cM@ H************************************************************************ hN iN5@ * Either type. Either is the simplest and most generic sum/variant type: a value of [('a, 'b) Either.t] is either a [Left (v : 'a)] or a [Right (v : 'b)]. It is a natural choice in the API of generic functions where values could fall in two different cases, possibly at different types, without assigning a specific meaning to what each case should be. For example: {[List.partition_map: ('a -> ('b, 'c) Either.t) -> 'a list -> 'b list * 'c list]} If you are looking for a parametrized type where one alternative means success and the other means failure, you should use the more specific type {!Result.t}. @since 4.12  n  Unlike [result], no [either] type is made available in Stdlib, one needs to access [Either.t] explicitly: - This type is less common in typical OCaml codebases, which prefer domain-specific variant types whose constructors carry more meaning. - Adding this to Stdlib would raise warnings in existing codebases that already use a constructor named Left or Right: + when opening a module that exports such a name, warning 45 is raised + adding a second constructor of the same name in scope kicks in the disambiguation mechanisms, and warning 41 may now be raised by existing code. If the use becomes more common in the future we can always revisit this choice.  qf rv  @!* wx   xx  @ Y* A value of [('a, 'b) Either.t] contains either a value of ['a] or a value of ['b]  8* [left v] is [Left v].  :* [right v] is [Right v].  @* [is_left (Left v)] is [true], [is_left (Right v)] is [false]. \ B* [is_right (Left v)] is [false], [is_right (Right v)] is [true].  * [get_left e] is [v] if [e] is [Left v] and raise otherwise. @raise Invalid_argument if [e] is [Right _]. @since 5.4  * [get_right e] is [v] if [e] is [Right v] and raise otherwise. @raise Invalid_argument if [e] is [Left _]. @since 5.4 G D* [find_left (Left v)] is [Some v], [find_left (Right _)] is [None] ޠ F* [find_right (Right v)] is [Some v], [find_right (Left _)] is [None] u U* [map_left f e] is [Left (f v)] if [e] is [Left v] and [e] if [e] is [Right _]. 砠 W* [map_right f e] is [Right (f v)] if [e] is [Right v] and [e] if [e] is [Left _]. Y i* [map ~left ~right (Left v)] is [Left (left v)], [map ~left ~right (Right v)] is [Right (right v)].  `* [fold ~left ~right (Left v)] is [left v], and [fold ~left ~right (Right v)] is [right v].  M* [retract (Left v)] is [v], and [retract (Right v)] is [v]. @since 5.4 Š `* [iter ~left ~right (Left v)] is [left v], and [iter ~left ~right (Right v)] is [right v]. $ f* [for_all ~left ~right (Left v)] is [left v], and [for_all ~left ~right (Right v)] is [right v].  * [equal ~left ~right e0 e1] tests equality of [e0] and [e1] using [left] and [right] to respectively compare values wrapped by [Left _] and [Right _].  * [compare ~left ~right e0 e1] totally orders [e0] and [e1] using [left] and [right] to respectively compare values wrapped by [Left _ ] and [Right _]. [Left _] values are smaller than [Right _] values. @?)../ocamlc0-strict-sequence(-absname"-w5+a-4-9-41-42-44-45-48"-g+-warn-error"+A*-bin-annot)-nostdlib*-principal"-o2stdlib__Either.cmi"-c  [/home/teraram/ci/builds/workspace/parallel-build/flambda/false/label/ocaml-manycores/stdlib @@0uQGIiwi3        @ @@8CamlinternalFormatBasics0%FU(Q/Tu&Stdlib0Lku]8_٠ 0Vy`u~c @0Vy`u~c ATCA@Ր'   g@@ x @@H@@԰):@ ) Z@@ѐ.e@@    @Ґgx v@@@@P@@