Module Dfm_text.Parser


module Parser: sig .. end


type float_type =
| Single
| Date
| Extended of (int64 * int)
| Currency

type token =
| ToEOF
| ToSymbol of string
| ToString of string
| ToInteger of int64
| ToFloat of float * float_type
| ToWString of Unicode.utf16_string
| ToChar of char
| ToBinary of Dfm.byte_array
exception Error of int * string
type t 
val error : t -> string -> 'a
val skip_blanks : t -> unit
val next_token : t -> unit
val create : char Stream.t -> t
val source_line : t -> int
val token : t -> token
val token_symbol_is : t -> string -> bool
val token_char_is : t -> char -> bool