Module Parmatch

val const_compare : Asttypes.constant -> Asttypes.constant -> int
val le_pat : Typedtree.pattern -> Typedtree.pattern -> bool
val le_pats : Typedtree.pattern list -> Typedtree.pattern list -> bool
module Compat (_ : sig ... end) : sig ... end
exception Empty
val lubs : Typedtree.pattern list -> Typedtree.pattern list -> Typedtree.pattern list
val get_mins : ('a -> 'a -> bool) -> 'a list -> 'a list
val set_args_erase_mutable : Typedtree.pattern -> Typedtree.pattern list -> Typedtree.pattern list
type pat_explosion =
  1. | PE_single
  2. | PE_gadt_cases
type ppat_of_type =
  1. | PT_empty
  2. | PT_any
  3. | PT_pattern of pat_explosion * Parsetree.pattern * (string, Types.constructor_description) Hashtbl.t * (string, Types.label_description) Hashtbl.t
val ppat_of_type : Env.t -> Types.type_expr -> ppat_of_type
val pressure_variants : Env.t -> Typedtree.pattern list -> unit
val pressure_variants_in_computation_pattern : Env.t -> Typedtree.computation Typedtree.general_pattern list -> unit
val irrefutable : Typedtree.pattern -> bool
val inactive : partial:Typedtree.partial -> Typedtree.pattern -> bool
val check_ambiguous_bindings : Typedtree.value Typedtree.case list -> unit
val some_private_tag : Asttypes.label