hdiff-0.0.1: Pattern-Expression-based differencing of arbitrary types.

Safe HaskellSafe
LanguageHaskell2010

Data.Exists

Documentation

data Exists (f :: k -> *) :: * where Source #

Constructors

Exists :: f x -> Exists f 
Instances
Eq (Exists (MetaVarI :: Atom kon -> Type)) Source # 
Instance details

Defined in Data.HDiff.MetaVar

Eq (Exists (MetaVarIK ki)) Source # 
Instance details

Defined in Data.HDiff.MetaVar

Methods

(==) :: Exists (MetaVarIK ki) -> Exists (MetaVarIK ki) -> Bool #

(/=) :: Exists (MetaVarIK ki) -> Exists (MetaVarIK ki) -> Bool #

(EqHO ki, TestEquality ki) => Eq (Exists (Holes ki codes (MetaVarIK ki))) Source # 
Instance details

Defined in Data.HDiff.Change.Classify

Methods

(==) :: Exists (Holes ki codes (MetaVarIK ki)) -> Exists (Holes ki codes (MetaVarIK ki)) -> Bool #

(/=) :: Exists (Holes ki codes (MetaVarIK ki)) -> Exists (Holes ki codes (MetaVarIK ki)) -> Bool #

Ord (Exists (MetaVarI :: Atom kon -> Type)) Source # 
Instance details

Defined in Data.HDiff.MetaVar

Ord (Exists (MetaVarIK ki)) Source # 
Instance details

Defined in Data.HDiff.MetaVar

(forall (i :: k). Show (x i)) => Show (Exists x) Source # 
Instance details

Defined in Data.Exists

Methods

showsPrec :: Int -> Exists x -> ShowS #

show :: Exists x -> String #

showList :: [Exists x] -> ShowS #

exMap :: (forall x. f x -> g x) -> Exists f -> Exists g Source #

exMapM :: Monad m => (forall x. f x -> m (g x)) -> Exists f -> m (Exists g) Source #

exElim :: (forall x. f x -> a) -> Exists f -> a Source #