unbound-generics-0.4.0: Support for programming with names and binders using GHC Generics

Copyright(c) 2018 Reed Mullanix
LicenseBSD3 (See LICENSE)
MaintainerReed Mullanix
Stabilityexperimental
Safe HaskellNone
LanguageHaskell2010

Unbound.Generics.LocallyNameless.Ignore

Description

Ignores a term for the purposes of alpha-equality and substitution

Synopsis

Documentation

data Ignore t Source #

Ignores a term t for the purpose of alpha-equality and substitution

Constructors

I !t 
Instances
Subst a (Ignore b) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Subst

Methods

isvar :: Ignore b -> Maybe (SubstName (Ignore b) a) Source #

isCoerceVar :: Ignore b -> Maybe (SubstCoerce (Ignore b) a) Source #

subst :: Name a -> a -> Ignore b -> Ignore b Source #

substs :: [(Name a, a)] -> Ignore b -> Ignore b Source #

Show t => Show (Ignore t) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Ignore

Methods

showsPrec :: Int -> Ignore t -> ShowS #

show :: Ignore t -> String #

showList :: [Ignore t] -> ShowS #

Generic (Ignore t) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Ignore

Associated Types

type Rep (Ignore t) :: * -> * #

Methods

from :: Ignore t -> Rep (Ignore t) x #

to :: Rep (Ignore t) x -> Ignore t #

NFData t => NFData (Ignore t) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Ignore

Methods

rnf :: Ignore t -> () #

Show t => Alpha (Ignore t) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Ignore

type Rep (Ignore t) Source # 
Instance details

Defined in Unbound.Generics.LocallyNameless.Ignore

type Rep (Ignore t) = D1 (MetaData "Ignore" "Unbound.Generics.LocallyNameless.Ignore" "unbound-generics-0.4.0-3CzcjD8SUhgLQazt2sGCP5" False) (C1 (MetaCons "I" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 t)))