Module Bytelink

val reset : unit -> unit
val check_consistency : string -> Cmo_format.compilation_unit -> unit
val extract_crc_interfaces : unit -> (string * Stdlib.Digest.t option) list
type error =
| File_not_found of string
| Not_an_object_file of string
| Wrong_object_name of string
| Symbol_error of string * Symtable.error
| Inconsistent_import of string * string * string
| Custom_runtime
| File_exists of string
| Cannot_open_dll of string
| Required_module_unavailable of string
exception Error of error
val report_error : Stdlib.Format.formatter -> error -> unit