Translmod
val transl_implementation : string -> (Typedtree.structure * Typedtree.module_coercion) -> Lambda.program
val transl_store_phrases : string -> Typedtree.structure -> int * Lambda.lambda
val transl_store_implementation : string -> (Typedtree.structure * Typedtree.module_coercion) -> Lambda.program
val transl_implementation_flambda : string -> (Typedtree.structure * Typedtree.module_coercion) -> Lambda.program
val transl_toplevel_definition : Typedtree.structure -> Lambda.lambda
val transl_package : Ident.t option list -> Ident.t -> Typedtree.module_coercion -> Lambda.lambda
val transl_store_package : Ident.t option list -> Ident.t -> Typedtree.module_coercion -> int * Lambda.lambda
val transl_package_flambda : Ident.t option list -> Typedtree.module_coercion -> int * Lambda.lambda
val toplevel_name : Ident.t -> string
val primitive_declarations : Primitive.description list ref
type unsafe_info =
| Unsafe of {
} | |||
| Unnamed |
exception Error of Location.t * error
val report_error : Location.t -> error -> Location.error