1995-08-09 08:06:35 -07:00
|
|
|
(***********************************************************************)
|
|
|
|
(* *)
|
1996-04-30 07:53:58 -07:00
|
|
|
(* Objective Caml *)
|
1995-08-09 08:06:35 -07:00
|
|
|
(* *)
|
|
|
|
(* Xavier Leroy, projet Cristal, INRIA Rocquencourt *)
|
|
|
|
(* *)
|
1996-04-30 07:53:58 -07:00
|
|
|
(* Copyright 1996 Institut National de Recherche en Informatique et *)
|
1995-08-09 08:06:35 -07:00
|
|
|
(* Automatique. Distributed only by permission. *)
|
|
|
|
(* *)
|
|
|
|
(***********************************************************************)
|
|
|
|
|
|
|
|
(* $Id$ *)
|
|
|
|
|
1995-05-04 03:15:53 -07:00
|
|
|
(* Typechecking of type expressions for the core language *)
|
|
|
|
|
|
|
|
val transl_simple_type:
|
1996-09-23 04:33:27 -07:00
|
|
|
Env.t -> bool -> Parsetree.core_type -> Types.type_expr
|
1995-05-04 03:15:53 -07:00
|
|
|
val transl_type_scheme:
|
1996-09-23 04:33:27 -07:00
|
|
|
Env.t -> Parsetree.core_type -> Types.type_expr
|
1995-05-04 03:15:53 -07:00
|
|
|
val reset_type_variables: unit -> unit
|
1996-09-23 04:33:27 -07:00
|
|
|
val enter_type_variable: bool -> string -> Types.type_expr
|
|
|
|
val type_variable : Location.t -> string -> Types.type_expr
|
|
|
|
val type_variable_list : unit -> Types.type_expr list
|
1995-05-04 03:15:53 -07:00
|
|
|
|
|
|
|
exception Already_bound
|
|
|
|
|
|
|
|
type error =
|
|
|
|
Unbound_type_variable of string
|
|
|
|
| Unbound_type_constructor of Longident.t
|
|
|
|
| Type_arity_mismatch of Longident.t * int * int
|
1996-04-22 04:15:41 -07:00
|
|
|
| Bound_type_variable of string
|
|
|
|
| Recursive_type
|
|
|
|
| Unbound_class of Longident.t
|
|
|
|
| Unbound_row_variable of Longident.t
|
1996-09-23 04:33:27 -07:00
|
|
|
| Type_mismatch of Types.type_expr * Types.type_expr
|
1995-05-04 03:15:53 -07:00
|
|
|
|
|
|
|
exception Error of Location.t * error
|
|
|
|
|
|
|
|
val report_error: error -> unit
|