Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
Instances
GenericK (Tree a :: Type) Source # | |
Generic (Tree a) Source # | |
GenericK Tree Source # | |
type RepK (Tree a :: Type) Source # | |
type Rep (Tree a) Source # | |
Defined in Generics.Kind.Examples type Rep (Tree a) = D1 ('MetaData "Tree" "Generics.Kind.Examples" "kind-generics-0.5.0.0-AnGCroIa81x7qb6vZQx0Or" 'False) (C1 ('MetaCons "Branch" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Tree a)) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Tree a))) :+: C1 ('MetaCons "Leaf" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 a))) | |
type RepK Tree Source # | |
data family HappyFamily t Source #
Instances
data SimpleIndex :: Type -> Type -> Type where Source #
MkSimpleIndex :: [a] -> SimpleIndex [a] b |
Instances
GenericK (SimpleIndex a b :: Type) Source # | |
Defined in Generics.Kind.Examples fromK :: forall (x :: LoT k). (SimpleIndex a b :@@: x) -> RepK (SimpleIndex a b) x Source # toK :: forall (x :: LoT k). RepK (SimpleIndex a b) x -> SimpleIndex a b :@@: x Source # | |
GenericK SimpleIndex Source # | |
Defined in Generics.Kind.Examples fromK :: forall (x :: LoT k). (SimpleIndex :@@: x) -> RepK SimpleIndex x Source # toK :: forall (x :: LoT k). RepK SimpleIndex x -> SimpleIndex :@@: x Source # | |
GenericK (SimpleIndex a :: Type -> Type) Source # | |
Defined in Generics.Kind.Examples fromK :: forall (x :: LoT k). (SimpleIndex a :@@: x) -> RepK (SimpleIndex a) x Source # toK :: forall (x :: LoT k). RepK (SimpleIndex a) x -> SimpleIndex a :@@: x Source # | |
type RepK (SimpleIndex a b :: Type) Source # | |
type RepK SimpleIndex Source # | |
type RepK (SimpleIndex a :: Type -> Type) Source # | |
data WeirdTree a where Source #
WeirdBranch :: WeirdTree a -> WeirdTree a -> WeirdTree a | |
WeirdLeaf :: Show a => t -> a -> WeirdTree a |
Instances
GenericK WeirdTree Source # | |
type RepK WeirdTree Source # | |
Defined in Generics.Kind.Examples type RepK WeirdTree = (Field (WeirdTree :$: (Var0 :: Atom (TYPE LiftedRep -> Type) (TYPE LiftedRep))) :*: Field (WeirdTree :$: (Var0 :: Atom (TYPE LiftedRep -> Type) (TYPE LiftedRep)))) :+: Exists Type ((Show :$: (Var1 :: Atom (Type -> TYPE LiftedRep -> Type) (TYPE LiftedRep))) :=>: (Field (Var0 :: Atom (Type -> Type -> Type) Type) :*: Field (Var1 :: Atom (Type -> Type -> Type) Type))) |
data WeirdTreeR a where Source #
WeirdBranchR :: WeirdTreeR a -> WeirdTreeR a -> WeirdTreeR a | |
WeirdLeafR :: (Show a, Eq t, Typeable t) => t -> a -> WeirdTreeR a |