package erlang

  1. Overview
  2. Docs
exception Can_not_print_that_yet
val aux_pp_list : Stdlib.Format.formatter -> ('a -> unit) -> 'b list -> unit
val pp_var : Stdlib.Format.formatter -> string -> unit
val pp_literal : Stdlib.Format.formatter -> Erlang__.Core_ast.literal -> unit
val pp_expr : Stdlib.Format.formatter -> Erlang__.Core_ast.expr -> unit
val pp_fun_expr : Stdlib.Format.formatter -> Erlang__.Core_ast.fun_expr -> unit
val pp_fname : Stdlib.Format.formatter -> Erlang__.Core_ast.fname -> unit
val pp_fun_def : Stdlib.Format.formatter -> Erlang__.Core_ast.fun_def -> unit
val pp : Stdlib.Format.formatter -> Erlang__.Core_ast.t -> unit
val to_source_file : Erlang__.Core_ast.t -> unit
val to_sources : Erlang__.Core_ast.t list -> unit