Caml1999I037!;ؠ0Stdlib__Callback(register@&stringQ@@@@!a@$unitF@@@@@@@@,callback.mliW66W6Y@@@@@2register_exception@@@@@#exnG@@@@@@@@@@@\\&@@:A@@@n;/0Stdlib__Callback0EX]b@&Stdlib0Lku]8_٠8CamlinternalFormatBasics0%FU(Q/Tu@@@Caml1999T037: !C0Stdlib__Callback*ocaml.text&_none_@@A Registering OCaml values with the C runtime. This module allows OCaml values to be registered with the C runtime under a symbolic name, so that C code can later call back registered OCaml functions, or raise registered OCaml exceptions. ,callback.mliP77U24@@@@@@3@@@@@@#intA;@@@A@@@@@:@A@$charB;@@A@@@@@>@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(registerW6:W6B@б@гT&stringW6EW6K@@ @@@@@б@А!a@A@W6OW6Q@@гQ$unitW6UW6Y@@ @@@@@@@@@@@#@@& @@@W66@)ocaml.docĐ [Callback.register n v] registers the value [v] under the name [n]. C code can later retrieve a handle to [v] by calling [caml_named_value(n)]. XZZZ@@@@@@@@@@ @Ր@@@@@@2register_exception\\@б@г&string\\@@ @@@3@o:@A@@б@г#exn\\@@ @@@@@г$unit\"\&@@ @@@@@@@@!@@@'@@$* @@@\@] R [Callback.register_exception n exn] registers the exception contained in the exception value [exn] under the name [n]. C code can later retrieve a handle to the exception by calling [caml_named_value(n)]. The exception value thus obtained is suitable for passing as first argument to [raise_constant] or [raise_with_arg]. ]''bP~@@@@@@@5A@@@m0@@@@@@C@}@["@@3,++,,,,,@H]$@A@ H************************************************************************5A@@6A@L@ H ;BMM