package erlang

  1. Overview
  2. Docs

Module Erlang.PrinterSource

Sourceexception Invalid_case_branch
Sourceexception Undefined_function_reference of string
Sourceexception Function_without_cases of string
Sourceexception Lambda_without_cases
Sourceexception Function_spec_with_less_than_2_parts of string
Sourceexception Type_constructors_must_be_atoms_or_qualified_names of Erlang__.Erl_ast.name
Sourceexception Invalid_case_expresion_without_branches
Sourceexception Invalid_receive_expresion_without_branches
Sourceexception Unknown_support_function
Sourceexception Invalid_cons_with_no_left_hand_side
Sourcemodule H : sig ... end
Sourceval pp_atom : Format.formatter -> Erlang__.Erl_ast.atom -> unit
Sourceval name_to_string : Erlang__.Erl_ast.name -> string
Sourceval pp_exports : Format.formatter -> Erlang__.Erl_ast.export list -> unit
Sourceval pp_comment : Format.formatter -> Erlang__.Erl_ast.comment -> unit
Sourceval pp_type_expr : string -> Format.formatter -> Erlang__.Erl_ast.type_expr -> unit
Sourceval pp_pattern_match : Format.formatter -> Erlang__.Erl_ast.pattern -> unit
Sourceval pp_literal : Format.formatter -> Erlang__.Erl_ast.literal -> unit
Sourceval pp_name : Format.formatter -> Erlang__.Erl_ast.name -> unit
Sourceval pp_expression_list : string -> Format.formatter -> Erlang__.Erl_ast.expr list -> module_:'a -> unit
Sourceval pp_if_case_branch : string -> Format.formatter -> (Erlang__.Erl_ast.expr list list * Erlang__.Erl_ast.expr) -> module_:'a -> unit
Sourceval pp_if_case_branches : string -> Format.formatter -> (Erlang__.Erl_ast.expr list list * Erlang__.Erl_ast.expr) list -> module_:'a -> unit
Sourceval pp_case_guard : Format.formatter -> Erlang__.Erl_ast.expr list option -> module_:'a -> unit
Sourceval pp_case_branches : string -> Format.formatter -> Erlang__.Erl_ast.case list -> module_:'a -> unit
Sourceval pp_expression : string -> Format.formatter -> Erlang__.Erl_ast.expr -> module_:'a -> unit
Sourceval pp_fun_args : Format.formatter -> Erlang__.Erl_ast.pattern list -> unit
Sourceval pp_fun_case : string -> Format.formatter -> Erlang__.Erl_ast.case -> module_:'a -> unit
Sourceval pp_fun_cases : string -> Format.formatter -> Erlang__.Erl_ast.atom -> Erlang__.Erl_ast.case list -> module_:'a -> unit
Sourceval pp_fun_spec : string -> Format.formatter -> Erlang__.Erl_ast.atom -> Erlang__.Erl_ast.type_expr list -> Erlang__.Erl_ast.type_expr -> unit
Sourceval pp_function : Format.formatter -> Erlang__.Erl_ast.fun_decl -> module_:'a -> unit
Sourceval pp_functions : Format.formatter -> Erlang__.Erl_ast.fun_decl list -> module_:'a -> unit
Sourceval pp_types : Format.formatter -> Erlang__.Erl_ast.type_decl list -> unit
Sourceval pp : Format.formatter -> Erlang__.Erl_ast.t -> unit
Sourceval to_source_file : Erlang__.Erl_ast.t -> unit
Sourceval to_sources : Erlang__.Erl_ast.t list -> unit
OCaml

Innovation. Community. Security.