Bytelink
module Dep :
Set.OrderedType with type t = Cmo_format.compunit * Cmo_format.compunit
val link : Misc.filepath list -> Misc.filepath -> unit
val check_consistency : Misc.filepath -> Cmo_format.compilation_unit -> unit
val linkdeps_unit :
Linkdeps.t ->
filename:string ->
Cmo_format.compilation_unit ->
unit
val extract_crc_interfaces : unit -> Misc.crcs
type error =
| File_not_found of Misc.filepath
| Not_an_object_file of Misc.filepath
| Wrong_object_name of Misc.filepath
| Symbol_error of Misc.filepath * Symtable.error
| Inconsistent_import of Misc.modname * Misc.filepath * Misc.filepath
| Custom_runtime
| File_exists of Misc.filepath
| Cannot_open_dll of Misc.filepath
| Camlheader of string * Misc.filepath
| Link_error of Linkdeps.error
exception Error of error
val report_error : error Format_doc.format_printer
val report_error_doc : error Format_doc.printer