sig
  val extended_of_string : (string -> float * (int64 * int)) Pervasives.ref
  val string_of_extended : (float * (int64 * int) -> string) Pervasives.ref
  module Parser :
    sig
      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 * Dfm_text.Parser.float_type
        | ToWString of Unicode.utf16_string
        | ToChar of char
        | ToBinary of Dfm.byte_array
      exception Error of int * string
      type t
      val error : Dfm_text.Parser.t -> string -> 'a
      val skip_blanks : Dfm_text.Parser.t -> unit
      val next_token : Dfm_text.Parser.t -> unit
      val create : char Stream.t -> Dfm_text.Parser.t
      val source_line : Dfm_text.Parser.t -> int
      val token : Dfm_text.Parser.t -> Dfm_text.Parser.token
      val token_symbol_is : Dfm_text.Parser.t -> string -> bool
      val token_char_is : Dfm_text.Parser.t -> char -> bool
    end
  val internal_binary_to_text :
    ?name:string Pervasives.ref ->
    ?linefeed:string ->
    ?indent:string ->
    ?utf8:bool -> (string -> int -> int -> int) -> (string -> unit) -> unit
  val binary_to_text :
    ?name:string Pervasives.ref ->
    ?linefeed:string ->
    ?indent:string ->
    ?utf8:bool -> Pervasives.in_channel -> Pervasives.out_channel -> unit
  val resource_to_text :
    ?resource_name:string Pervasives.ref ->
    ?name:string Pervasives.ref ->
    ?linefeed:string ->
    ?indent:string ->
    ?utf8:bool -> Pervasives.in_channel -> Pervasives.out_channel -> unit
  val internal_text_to_binary :
    ?name:string Pervasives.ref ->
    ?no_utf16:bool -> char Stream.t -> (string -> int -> int -> unit) -> unit
  val text_to_binary :
    ?name:string Pervasives.ref ->
    ?no_utf16:bool -> Pervasives.in_channel -> Pervasives.out_channel -> unit
  val text_to_resource :
    ?resource_name:string ->
    ?name:string Pervasives.ref ->
    ?no_utf16:bool -> Pervasives.in_channel -> Pervasives.out_channel -> unit
end