Module Odoc_latex

val separate_files : bool ref
val latex_titles : (int * string) list ref
val latex_value_prefix : string ref
val latex_type_prefix : string ref
val latex_type_elt_prefix : string ref
val latex_extension_prefix : string ref
val latex_exception_prefix : string ref
val latex_module_prefix : string ref
val latex_module_type_prefix : string ref
val latex_class_prefix : string ref
val latex_class_type_prefix : string ref
val latex_attribute_prefix : string ref
val latex_method_prefix : string ref
val new_buf : unit -> Stdlib.Buffer.t
val new_fmt : unit -> Stdlib.Format.formatter * (unit -> string)
val ps : Stdlib.Format.formatter -> string -> unit
val bp : Stdlib.Buffer.t -> ('a, Stdlib.Buffer.t, unit) format -> 'a
val bs : Stdlib.Buffer.t -> string -> unit
val merge_codepre : Odoc_info.text_element list -> Odoc_info.text_element list
val print_concat : Stdlib.Format.formatter -> string -> ('a -> unit) -> 'a list -> unit
class text : object ... end
class virtual info : object ... end
module Generator : sig ... end
module type Latex_generator = sig ... end