sig
exception Error of string
val initialize : unit -> bool
type llexecutionengine
type llcompileroptions = {
opt_level : int;
code_model : Llvm_target.CodeModel.t;
no_framepointer_elim : bool;
enable_fast_isel : bool;
}
val default_compiler_options : Llvm_executionengine.llcompileroptions
val create :
?options:Llvm_executionengine.llcompileroptions ->
Llvm.llmodule -> Llvm_executionengine.llexecutionengine
val dispose : Llvm_executionengine.llexecutionengine -> unit
val add_module :
Llvm.llmodule -> Llvm_executionengine.llexecutionengine -> unit
val remove_module :
Llvm.llmodule -> Llvm_executionengine.llexecutionengine -> unit
val run_static_ctors : Llvm_executionengine.llexecutionengine -> unit
val run_static_dtors : Llvm_executionengine.llexecutionengine -> unit
val data_layout :
Llvm_executionengine.llexecutionengine -> Llvm_target.DataLayout.t
val add_global_mapping :
Llvm.llvalue ->
'a Ctypes.ptr -> Llvm_executionengine.llexecutionengine -> unit
val get_global_value_address :
string -> 'a Ctypes.typ -> Llvm_executionengine.llexecutionengine -> 'a
val get_function_address :
string -> 'a Ctypes.typ -> Llvm_executionengine.llexecutionengine -> 'a
end