Safe Haskell | Safe |
---|---|
Language | Haskell2010 |
Documentation
Instances
Generic (Tree a) Source # | |
GenericK (Tree a :: Type) LoT0 Source # | |
GenericK Tree (a :&&: LoT0 :: LoT (Type -> 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.2.1.0-EIx5csWBBFyDP9do2MK5yw" 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 a :: Type) Source # | |
type RepK Tree Source # | |
data family HappyFamily t Source #
Instances
GenericK (HappyFamily [a] :: Type) LoT0 Source # | |
Defined in Generics.Kind.Examples fromK :: (HappyFamily [a] :@@: LoT0) -> RepK (HappyFamily [a]) LoT0 Source # toK :: RepK (HappyFamily [a]) LoT0 -> HappyFamily [a] :@@: LoT0 Source # | |
GenericK (HappyFamily (Maybe a) :: Type) LoT0 Source # | |
Defined in Generics.Kind.Examples | |
GenericK HappyFamily (a :&&: LoT0 :: LoT (Type -> Type)) Source # | |
Defined in Generics.Kind.Examples | |
data HappyFamily [a] Source # | |
Defined in Generics.Kind.Examples | |
data HappyFamily (Maybe a) Source # | |
Defined in Generics.Kind.Examples | |
type RepK (HappyFamily [a] :: Type) Source # | |
Defined in Generics.Kind.Examples | |
type RepK (HappyFamily (Maybe a) :: Type) Source # | |
type RepK HappyFamily Source # | |
Defined in Generics.Kind.Examples |
data WeirdTree a where Source #
WeirdBranch :: WeirdTree a -> WeirdTree a -> WeirdTree a | |
WeirdLeaf :: Show a => t -> a -> WeirdTree a |
data WeirdTreeR a where Source #
WeirdBranchR :: WeirdTreeR a -> WeirdTreeR a -> WeirdTreeR a | |
WeirdLeafR :: (Show a, Eq t, Typeable t) => t -> a -> WeirdTreeR a |
Instances
Orphan instances
GenericK (Maybe a :: Type) LoT0 Source # | |
GenericK (Either a b :: Type) LoT0 Source # | |
GenericK Either (a :&&: (b :&&: LoT0) :: LoT (Type -> Type -> Type)) Source # | |
GenericK Maybe (a :&&: LoT0 :: LoT (Type -> Type)) Source # | |
GenericK (Either a :: Type -> Type) (b :&&: LoT0 :: LoT (Type -> Type)) Source # | |