kind-generics-0.1.0.0: Generic programming in GHC style for arbitrary kinds and GADTs.

Safe HaskellSafe
LanguageHaskell2010

Generics.Kind.Derive.Eq

Documentation

geq' :: forall t f x. (GenericS t f x, GEq (RepK f) x) => t -> t -> Bool Source #

class GEq (f :: LoT k -> *) (tys :: LoT k) where Source #

Methods

geq :: f tys -> f tys -> Bool Source #

Instances
GEq (U1 :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: U1 tys -> U1 tys -> Bool Source #

Eq (Ty t tys) => GEq (F t :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: F t tys -> F t tys -> Bool Source #

Ty c tys -> GEq f tys => GEq (c :=>: f :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: (c :=>: f) tys -> (c :=>: f) tys -> Bool Source #

(GEq f tys, GEq g tys) => GEq (f :*: g :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: (f :*: g) tys -> (f :*: g) tys -> Bool Source #

(GEq f tys, GEq g tys) => GEq (f :+: g :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: (f :+: g) tys -> (f :+: g) tys -> Bool Source #

GEq f tys => GEq (M1 i c f :: LoT k -> Type) (tys :: LoT k) Source # 
Instance details

Defined in Generics.Kind.Derive.Eq

Methods

geq :: M1 i c f tys -> M1 i c f tys -> Bool Source #