Caml1999I031L?+Stdlib__Fun"id@!a@@@)%identityAA @@@'fun.mliVV@@@@%const@!a@@@@@@@@@YY@@)A@$flip@@!a@@!b@!c@@@@@@ @@@@@@@@3]4]@@HB@&negate@@!a@$boolE@@@@@@ @@@@@@@@PaBBQaBk@@eC@'protect'finally@$unitF@@@@@@@@@@@@@!a@@@@@@@@ugvgJ@@D@ .Finally_raised #exnG@@@@@@A&_none_@@A@EB@@i9.+Stdlib__Fun0\c TE 3&Stdlib0yӶ~*8CamlinternalFormatBasics0cEXy@@@!@@A]]@@@]@ [flip f] reverses the argument order of the binary function [f]. For any arguments [x] and [y], [(flip f) x y] is [f y x]. '^(_@@@@@@@@?B@@V&negate3aBF4aBL@б@б@А!a@A@0>==>>>>>@m*@ADaBPEaBR@@г$boolMaBVNaBZ@@ @@@@@@@@@@б@А!a\aB`]aBb@@г4$booleaBffaBj@@ @@@)@@@1@@,@@@@@/qaBOraBk@@@uaBB@ t [negate p] is the negation of the predicate function [p]. For any argument [x], [(negate p) x] is [not (p x)]. bllc@@@@@@@C@@D " {1:exception Exception handling} ee@@@@@@0@Tg#@A'protectgg@б'finallyб@г$unitg'g+@@ @@@@@г$unitg/g3@@ @@@+@@@@@.@@б@б@г'$unitg9g=@@ @@@?@@А!a@A@HgAgC@@@ @@M@@А!aQgHgJ@@@ @@Vg8@@L.@@Zg @@@g @  [protect ~finally work] invokes [work ()] and then [finally ()] before [work ()] returns with its value or an exception. In the latter case the exception is re-raised after [finally ()]. If [finally ()] raises an exception, then the exception {!Finally_raised} is raised instead. [protect] can be used to enforce local invariants whether [work ()] returns normally or raises an exception. However, it does not protect against unexpected exceptions raised inside [finally ()] such as {!Stdlib.Out_of_memory}, {!Stdlib.Stack_overflow}, or asynchronous exceptions raised by signal handlers (e.g. {!Sys.Break}). Note: It is a {e programming error} if other kinds of exceptions are raised by [finally], as any exception raised in [work ()] will be lost in the event of a {!Finally_raised} exception. Therefore, one should make sure to handle those inside the finally. hKKx  @@@@@@@D@@n.Finally_raisedA z   z  @ ]@@@@@@Az  z  @ / [Finally_raised exn] is raised by [protect ~finally work] when [finally] raises an exception [exn]. This exception denotes either an unexpected exception or a programming error. As a general rule, one should not catch a [Finally_raised] exception except as part of a catch-all handler. "{  # % @@@@@@@@:E@г#exn.z  @@0,++,,,,,@A@A@@@@>@@@@@v @ @M@82B@@0<;;<<<<<@:4@A@ H************************************************************************EA@@FA@L@ H KBMMLBM@ H OCaml QCRC@ H WDXD3@ H The OCaml programmers ]E44^E4@ H cFdF@ H Copyright 2018 Institut National de Recherche en Informatique et iGjG@ H en Automatique. oHpHg@ H uIhhvIh@ H All rights reserved. This file is distributed under the terms of {J|J@ 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@ ** Function manipulation. @since 4.08 >* {1:combinators Combinators} Z F* [id] is the identity function. For any argument [x], [id x] is [x]. % m* [const c] is a function that always returns the value [c]. For any argument [x], [(const c) x] is [c]. 砠 * [flip f] reverses the argument order of the binary function [f]. For any arguments [x] and [y], [(flip f) x y] is [f y x]. ~ u* [negate p] is the negation of the predicate function [p]. For any argument [x], [(negate p) x] is [not (p x)]. ' #* {1:exception Exception handling}  * [protect ~finally work] invokes [work ()] and then [finally ()] before [work ()] returns with its value or an exception. In the latter case the exception is re-raised after [finally ()]. If [finally ()] raises an exception, then the exception {!Finally_raised} is raised instead. [protect] can be used to enforce local invariants whether [work ()] returns normally or raises an exception. However, it does not protect against unexpected exceptions raised inside [finally ()] such as {!Stdlib.Out_of_memory}, {!Stdlib.Stack_overflow}, or asynchronous exceptions raised by signal handlers (e.g. {!Sys.Break}). Note: It is a {e programming error} if other kinds of exceptions are raised by [finally], as any exception raised in [work ()] will be lost in the event of a {!Finally_raised} exception. Therefore, one should make sure to handle those inside the finally.  0* [Finally_raised exn] is raised by [protect ~finally work] when [finally] raises an exception [exn]. This exception denotes either an unexpected exception or a programming error. As a general rule, one should not catch a [Finally_raised] exception except as part of a catch-all handler. @D)../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"-o/stdlib__Fun.cmi"-c :/home/barsac/ci/builds/workspace/step-by-step-build/stdlib @0DԭCP !0@@@8CamlinternalFormatBasics0cEXy