Up

module Raw_typer

: sig
#
type item =
# | Structure of Parsetree.structure
# | Signature of Parsetree.signature
# | Pattern of (Asttypes.label * Parsetree.expression option * Parsetree.pattern)
# | Eval of Parsetree.expression
# | Bindings of Asttypes.rec_flag * Parsetree.value_binding list
# | Newtype of string
# | Functor_argument of string Location.loc * Parsetree.module_type option
#
type t
#
val empty : t
#
val step : Raw_parser.symbol -> t -> t
#
val observe : t -> item list
#
val dump : Format.formatter -> t -> unit
#
val fresh_env : unit -> Env.t
end