package erlang
Legend:
Library
Module
Module type
Parameter
Class
Class type
Library
Module
Module type
Parameter
Class
Class type
and guard = expr list
and literal =
| Lit_integer of string
| Lit_char of string
| Lit_binary of string
| Lit_string of string
| Lit_float of string
| Lit_atom of atom
and expr =
| Expr_apply of fun_apply
| Expr_case of expr * case list
| Expr_catch of expr
| Expr_comment of comment * expr
| Expr_cons of expr list * expr
| Expr_fun of case list
| Expr_fun_ref of {
fref_name : name;
fref_arity : int;
}
| Expr_if of (expr list list * expr) list
| Expr_let of let_binding * expr
| Expr_list of expr list
| Expr_literal of literal
| Expr_macro of string
| Expr_map of map_field list
| Expr_map_update of expr * map_field list
| Expr_name of name
| Expr_nil
| Expr_recv of recv
| Expr_try of try_catch
| Expr_tuple of expr list
and pattern =
| Pattern_binding of name
| Pattern_catch of name option * pattern * name option
| Pattern_cons of pattern list * pattern
| Pattern_ignore
| Pattern_list of pattern list
| Pattern_map of (pattern * pattern) list
| Pattern_match of literal
| Pattern_tuple of pattern list
| Pattern_with_name of pattern * pattern
and type_expr =
| Type_function of {
}
| Type_constr of type_constr
| Type_variable of name
| Type_tuple of type_expr list
| Type_list of type_expr
| Type_record of name * record_field list
| Type_map of type_map_field list
| Type_variant of type_expr list
| Type_const of literal
An exported symbol in an Erlang module. This could be a function or a type. See: http://erlang.org/doc/reference_manual/modules.html for missing fields. http://erlang.org/doc/reference_manual/typespec.html
and structure = module_item list
val sexp_of_t : t -> Sexplib.Sexp.t
val sexp_of_structure : structure -> Sexplib.Sexp.t
val sexp_of_expr : expr -> Sexplib.Sexp.t
sectionYPositions = computeSectionYPositions($el), 10)"
x-init="setTimeout(() => sectionYPositions = computeSectionYPositions($el), 10)"
>