Generator.html
val mutable header : Buffer.t ->
?nav:
(Odoc_info.Name.t option * Odoc_info.Name.t option * Odoc_info.Name.t)
option ->
?comments:Odoc_info.text list ->
string ->
unit
val mutable known_classes_names : String.Set.t
val mutable known_modules_names : String.Set.t
val mutable known_types_names : String.Set.t
val mutable list_attributes : Odoc_info.Value.t_attribute list
val mutable list_class_types : Odoc_info.Class.t_class_type list
val mutable list_classes : Odoc_info.Class.t_class list
val mutable list_exceptions : Odoc_info.Exception.t_exception list
val mutable list_extensions : Odoc_info.Extension.t_extension_constructor list
val mutable list_methods : Odoc_info.Value.t_method list
val mutable list_module_types : Odoc_info.Module.t_module_type list
val mutable list_modules : Odoc_info.Module.t_module list
val mutable list_types : Odoc_info.Type.t_type list
val mutable list_values : Odoc_info.Value.t_value list
val mutable tag_functions : (string * (Odoc_info.text -> string)) list
method character_encoding : Buffer.t -> unit
method create_fully_qualified_idents_links : Odoc_info.Name.t ->
Odoc_info.Name.t ->
string
method create_fully_qualified_module_idents_links : Odoc_info.Name.t ->
Odoc_info.Name.t ->
string
method create_title_label : (int * string option * Odoc_info.text) -> string
method generate : Odoc_info.Module.t_module list -> unit
method generate_attributes_index : Odoc_info.Module.t_module list -> unit
method generate_class_inheritance_info : Buffer.t ->
Odoc_info.Class.t_class ->
unit
method generate_class_type_inheritance_info : Buffer.t ->
Odoc_info.Class.t_class_type ->
unit
method generate_class_types_index : Odoc_info.Module.t_module list -> unit
method generate_classes_index : Odoc_info.Module.t_module list -> unit
method generate_elements_index : ?strip_libname:bool ->
'a list ->
('a -> Odoc_info.Name.t) ->
('a -> Odoc_info.info option) ->
('a -> string) ->
string ->
string ->
unit
method generate_exceptions_index : Odoc_info.Module.t_module list -> unit
method generate_extensions_index : Odoc_info.Module.t_module list -> unit
method generate_for_class : Odoc_info.Class.t_class option ->
Odoc_info.Class.t_class option ->
Odoc_info.Class.t_class ->
unit
method generate_for_class_type : Odoc_info.Class.t_class_type option ->
Odoc_info.Class.t_class_type option ->
Odoc_info.Class.t_class_type ->
unit
method generate_for_module : Odoc_info.Module.t_module option ->
Odoc_info.Module.t_module option ->
Odoc_info.Module.t_module ->
unit
method generate_for_module_type : Odoc_info.Module.t_module_type option ->
Odoc_info.Module.t_module_type option ->
Odoc_info.Module.t_module_type ->
unit
method generate_index : Odoc_info.Module.t_module list -> unit
method generate_inheritance_info : Buffer.t ->
Odoc_info.Class.inherited_class list ->
unit
method generate_methods_index : Odoc_info.Module.t_module list -> unit
method generate_module_types_index : Odoc_info.Module.t_module list -> unit
method generate_modules_index : Odoc_info.Module.t_module list -> unit
method generate_types_index : Odoc_info.Module.t_module list -> unit
method generate_values_index : Odoc_info.Module.t_module list -> unit
method html_of_Block : Buffer.t -> Odoc_info.text -> unit
method html_of_Bold : Buffer.t -> Odoc_info.text -> unit
method html_of_Center : Buffer.t -> Odoc_info.text -> unit
method html_of_Code : Buffer.t -> string -> unit
method html_of_CodePre : Buffer.t -> string -> unit
method html_of_Emphasize : Buffer.t -> Odoc_info.text -> unit
method html_of_Enum : Buffer.t -> Odoc_info.text list -> unit
method html_of_Index_list : Buffer.t -> unit
method html_of_Italic : Buffer.t -> Odoc_info.text -> unit
method html_of_Latex : Buffer.t -> string -> unit
method html_of_Left : Buffer.t -> Odoc_info.text -> unit
method html_of_Link : Buffer.t -> string -> Odoc_info.text -> unit
method html_of_List : Buffer.t -> Odoc_info.text list -> unit
method html_of_Module_list : Buffer.t -> Odoc_info.Name.t list -> unit
method html_of_Newline : Buffer.t -> unit
method html_of_Raw : Buffer.t -> string -> unit
method html_of_Ref : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.ref_kind option ->
Odoc_info.text option ->
unit
method html_of_Right : Buffer.t -> Odoc_info.text -> unit
method html_of_Subscript : Buffer.t -> Odoc_info.text -> unit
method html_of_Superscript : Buffer.t -> Odoc_info.text -> unit
method html_of_Target : Buffer.t -> target:string -> code:string -> unit
method html_of_Title : Buffer.t ->
int ->
string option ->
Odoc_info.text ->
unit
method html_of_Verbatim : Buffer.t -> string -> unit
method html_of_alerts : Buffer.t -> Odoc_info.alert list -> unit
method html_of_attribute : Buffer.t -> Odoc_info.Value.t_attribute -> unit
method html_of_author_list : Buffer.t -> string list -> unit
method html_of_before : Buffer.t -> (string * Odoc_info.text) list -> unit
method html_of_class : Buffer.t ->
?complete:bool ->
?with_link:bool ->
Odoc_info.Class.t_class ->
unit
method html_of_class_comment : Buffer.t -> Odoc_info.text -> unit
method html_of_class_element : Buffer.t ->
Odoc_info.Class.class_element ->
unit
method html_of_class_kind : Buffer.t ->
Odoc_info.Name.t ->
?cl:Odoc_info.Class.t_class ->
Odoc_info.Class.class_kind ->
unit
method html_of_class_parameter_list : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Class.t_class ->
unit
method html_of_class_type : Buffer.t ->
?complete:bool ->
?with_link:bool ->
Odoc_info.Class.t_class_type ->
unit
method html_of_class_type_kind : Buffer.t ->
Odoc_info.Name.t ->
?ct:Odoc_info.Class.t_class_type ->
Odoc_info.Class.class_type_kind ->
unit
method html_of_class_type_param_expr_list : Buffer.t ->
Odoc_info.Name.t ->
Types.type_expr list ->
unit
method html_of_code : Buffer.t -> ?with_pre:bool -> string -> unit
method html_of_cstr_args : ?par:bool ->
Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Name.t ->
string ->
Odoc_info.Type.constructor_args ->
unit
method html_of_custom : Buffer.t -> (string * Odoc_info.text) list -> unit
method html_of_custom_text : Buffer.t -> string -> Odoc_info.text -> unit
method html_of_dag : (Odoc_info.Name.t * Odoc_info.Class.cct option)
Odoc_dag2html.dag ->
string
method html_of_described_parameter_list : Buffer.t ->
Odoc_info.Name.t ->
Odoc_parameter.parameter list ->
unit
method html_of_exception : Buffer.t -> Odoc_info.Exception.t_exception -> unit
method html_of_included_module : Buffer.t ->
Odoc_info.Module.included_module ->
unit
method html_of_info : ?cls:string ->
?indent:bool ->
Buffer.t ->
Odoc_types.info option ->
unit
method html_of_info_first_sentence : Buffer.t -> Odoc_info.info option -> unit
method html_of_method : Buffer.t -> Odoc_info.Value.t_method -> unit
method html_of_modtype : Buffer.t ->
?info:bool ->
?complete:bool ->
?with_link:bool ->
Odoc_info.Module.t_module_type ->
unit
method html_of_module : Buffer.t ->
?info:bool ->
?complete:bool ->
?with_link:bool ->
Odoc_info.Module.t_module ->
unit
method html_of_module_comment : Buffer.t -> Odoc_info.text -> unit
method html_of_module_element : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Module.module_element ->
unit
method html_of_module_kind : Buffer.t ->
Odoc_info.Name.t ->
?modu:Odoc_info.Module.t_module ->
Odoc_info.Module.module_kind ->
unit
method html_of_module_parameter : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Module.module_parameter ->
unit
method html_of_module_parameter_list : Buffer.t ->
Odoc_info.Name.t ->
(Odoc_info.Module.module_parameter * Odoc_info.text option) list ->
unit
method html_of_module_parameter_type : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Module.module_parameter ->
unit
method html_of_module_type : Buffer.t ->
?code:string ->
Odoc_info.Name.t ->
Types.module_type ->
unit
method html_of_module_type_kind : Buffer.t ->
Odoc_info.Name.t ->
?modu:Odoc_info.Module.t_module ->
?mt:Odoc_info.Module.t_module_type ->
Odoc_info.Module.module_type_kind ->
unit
method html_of_parameter_description : Buffer.t ->
Odoc_info.Parameter.parameter ->
unit
method html_of_parameter_list : Buffer.t ->
Odoc_info.Name.t ->
Odoc_parameter.parameter list ->
unit
method html_of_raised_exceptions : Buffer.t ->
(string * Odoc_info.text) list ->
unit
method html_of_record : father:Odoc_info.Name.t ->
close_env:string ->
(Odoc_info.Type.record_field -> string) ->
Buffer.t ->
Odoc_info.Type.record_field list ->
unit
method html_of_return_opt : Buffer.t -> Odoc_info.text option -> unit
method html_of_see : Buffer.t -> (Odoc_info.see_ref * Odoc_info.text) -> unit
method html_of_sees : Buffer.t ->
(Odoc_info.see_ref * Odoc_info.text) list ->
unit
method html_of_since_opt : Buffer.t -> string option -> unit
method html_of_text : ?with_p:bool -> Buffer.t -> Odoc_info.text -> unit
method html_of_text_element : Buffer.t -> Odoc_info.text_element -> unit
method html_of_text_with_p : Buffer.t -> Odoc_info.text -> unit
method html_of_type : Buffer.t -> Odoc_info.Type.t_type -> unit
method html_of_type_expr : Buffer.t ->
Odoc_info.Name.t ->
Types.type_expr ->
unit
method html_of_type_expr_param_list : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Type.t_type ->
unit
method html_of_type_extension : Buffer.t ->
Odoc_info.Name.t ->
Odoc_info.Extension.t_type_extension ->
unit
method html_of_value : Buffer.t -> Odoc_info.Value.t_value -> unit
method html_of_version_opt : Buffer.t -> string option -> unit
method html_sections_links : Buffer.t -> Odoc_info.text list -> unit
method inner_title : Odoc_info.Name.t -> string
method label_of_text : Odoc_info.text -> string
method list_attributes : Odoc_info.Value.t_attribute list
method list_class_types : Odoc_info.Class.t_class_type list
method list_classes : Odoc_info.Class.t_class list
method list_exceptions : Odoc_info.Exception.t_exception list
method list_extensions : Odoc_info.Extension.t_extension_constructor list
method list_methods : Odoc_info.Value.t_method list
method list_module_types : Odoc_info.Module.t_module_type list
method list_modules : Odoc_info.Module.t_module list
method list_types : Odoc_info.Type.t_type list
method list_values : Odoc_info.Value.t_value list
method meta : Buffer.t -> unit
method output_class_type : Odoc_info.Name.t ->
string ->
Types.class_type ->
unit
method private output_code : ?with_pre:bool ->
Odoc_info.Name.t ->
string ->
string ->
unit
method output_module_type : Odoc_info.Name.t ->
string ->
Types.module_type ->
unit
method prepare_header : Odoc_info.Module.t_module list -> unit
method print_header : Buffer.t ->
?nav:
(Odoc_info.Name.t option * Odoc_info.Name.t option * Odoc_info.Name.t)
option ->
?comments:Odoc_info.text list ->
string ->
unit