kind-apply-0.2.0.0: Utilities to work with lists of types
Data.PolyKinded.Atom
data TyVar d k where Source #
Constructors
type V0 = Var VZ Source #
type V1 = Var (VS VZ) Source #
type V2 = Var (VS (VS VZ)) Source #
type V3 = Var (VS (VS (VS VZ))) Source #
type V4 = Var (VS (VS (VS (VS VZ)))) Source #
type V5 = Var (VS (VS (VS (VS (VS VZ))))) Source #
type V6 = Var (VS (VS (VS (VS (VS (VS VZ)))))) Source #
type V7 = Var (VS (VS (VS (VS (VS (VS (VS VZ))))))) Source #
type V8 = Var (VS (VS (VS (VS (VS (VS (VS (VS VZ)))))))) Source #
type V9 = Var (VS (VS (VS (VS (VS (VS (VS (VS (VS VZ))))))))) Source #
data Atom d k where Source #
type (:$:) f x = Kon f :@: x Source #
type (:~:) a b = (Kon (~) :@: a) :@: b Source #
type family Ty (t :: Atom d k) (tys :: LoT d) :: k where ... Source #
Equations
type family Satisfies (cs :: [Atom d Constraint]) (tys :: LoT d) :: Constraint where ... Source #