ecta-1.0.0.3
Safe HaskellNone
LanguageHaskell2010

Application.TermSearch.Type

Documentation

data TypeSkeleton Source #

Instances

Instances details
Eq TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Data TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TypeSkeleton -> c TypeSkeleton #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TypeSkeleton #

toConstr :: TypeSkeleton -> Constr #

dataTypeOf :: TypeSkeleton -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TypeSkeleton) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TypeSkeleton) #

gmapT :: (forall b. Data b => b -> b) -> TypeSkeleton -> TypeSkeleton #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TypeSkeleton -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TypeSkeleton -> r #

gmapQ :: (forall d. Data d => d -> u) -> TypeSkeleton -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TypeSkeleton -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TypeSkeleton -> m TypeSkeleton #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeSkeleton -> m TypeSkeleton #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TypeSkeleton -> m TypeSkeleton #

Ord TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Read TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Show TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Generic TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

Associated Types

type Rep TypeSkeleton :: Type -> Type #

Hashable TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

type Rep TypeSkeleton Source # 
Instance details

Defined in Application.TermSearch.Type

data Mode Source #

Constructors

Normal 
HKTV 
Lambda 

Instances

Instances details
Eq Mode Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

(==) :: Mode -> Mode -> Bool #

(/=) :: Mode -> Mode -> Bool #

Data Mode Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Mode -> c Mode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Mode #

toConstr :: Mode -> Constr #

dataTypeOf :: Mode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Mode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Mode) #

gmapT :: (forall b. Data b => b -> b) -> Mode -> Mode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Mode -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Mode -> r #

gmapQ :: (forall d. Data d => d -> u) -> Mode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Mode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Mode -> m Mode #

Ord Mode Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

compare :: Mode -> Mode -> Ordering #

(<) :: Mode -> Mode -> Bool #

(<=) :: Mode -> Mode -> Bool #

(>) :: Mode -> Mode -> Bool #

(>=) :: Mode -> Mode -> Bool #

max :: Mode -> Mode -> Mode #

min :: Mode -> Mode -> Mode #

Show Mode Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

showsPrec :: Int -> Mode -> ShowS #

show :: Mode -> String #

showList :: [Mode] -> ShowS #

Generic Mode Source # 
Instance details

Defined in Application.TermSearch.Type

Associated Types

type Rep Mode :: Type -> Type #

Methods

from :: Mode -> Rep Mode x #

to :: Rep Mode x -> Mode #

type Rep Mode Source # 
Instance details

Defined in Application.TermSearch.Type

type Rep Mode = D1 ('MetaData "Mode" "Application.TermSearch.Type" "ecta-1.0.0.3-GsgcdoZGkFZA4oJqDsbHRS" 'False) (C1 ('MetaCons "Normal" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "HKTV" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Lambda" 'PrefixI 'False) (U1 :: Type -> Type)))

data AblationType Source #

Instances

Instances details
Eq AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

Data AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AblationType -> c AblationType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AblationType #

toConstr :: AblationType -> Constr #

dataTypeOf :: AblationType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AblationType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AblationType) #

gmapT :: (forall b. Data b => b -> b) -> AblationType -> AblationType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AblationType -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AblationType -> r #

gmapQ :: (forall d. Data d => d -> u) -> AblationType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AblationType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AblationType -> m AblationType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AblationType -> m AblationType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AblationType -> m AblationType #

Ord AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

Show AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

Generic AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

Associated Types

type Rep AblationType :: Type -> Type #

type Rep AblationType Source # 
Instance details

Defined in Application.TermSearch.Type

type Rep AblationType = D1 ('MetaData "AblationType" "Application.TermSearch.Type" "ecta-1.0.0.3-GsgcdoZGkFZA4oJqDsbHRS" 'False) ((C1 ('MetaCons "Default" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NoReduction" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "NoEnumeration" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NoOptimize" 'PrefixI 'False) (U1 :: Type -> Type)))