| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Blanks.UnderScope
Description
Internals. You will probably never need these.
Documentation
data BinderScope n e Source #
Constructors
| BinderScope | |
Fields
| |
Instances
newtype BoundScope Source #
Constructors
| BoundScope | |
Fields
| |
Instances
| Eq BoundScope Source # | |
Defined in Blanks.UnderScope | |
| Show BoundScope Source # | |
Defined in Blanks.UnderScope Methods showsPrec :: Int -> BoundScope -> ShowS # show :: BoundScope -> String # showList :: [BoundScope] -> ShowS # | |
| NFData BoundScope Source # | |
Defined in Blanks.UnderScope Methods rnf :: BoundScope -> () # | |
newtype EmbedScope f e Source #
Constructors
| EmbedScope | |
Fields
| |
Instances
| Functor f => Functor (EmbedScope f) Source # | |
Defined in Blanks.UnderScope Methods fmap :: (a -> b) -> EmbedScope f a -> EmbedScope f b # (<$) :: a -> EmbedScope f b -> EmbedScope f a # | |
| Eq (f e) => Eq (EmbedScope f e) Source # | |
Defined in Blanks.UnderScope Methods (==) :: EmbedScope f e -> EmbedScope f e -> Bool # (/=) :: EmbedScope f e -> EmbedScope f e -> Bool # | |
| Show (f e) => Show (EmbedScope f e) Source # | |
Defined in Blanks.UnderScope Methods showsPrec :: Int -> EmbedScope f e -> ShowS # show :: EmbedScope f e -> String # showList :: [EmbedScope f e] -> ShowS # | |
| NFData (f e) => NFData (EmbedScope f e) Source # | |
Defined in Blanks.UnderScope Methods rnf :: EmbedScope f e -> () # | |
Constructors
| FreeScope | |
Fields
| |
Instances
| Functor FreeScope Source # | |
| Foldable FreeScope Source # | |
Defined in Blanks.UnderScope Methods fold :: Monoid m => FreeScope m -> m # foldMap :: Monoid m => (a -> m) -> FreeScope a -> m # foldr :: (a -> b -> b) -> b -> FreeScope a -> b # foldr' :: (a -> b -> b) -> b -> FreeScope a -> b # foldl :: (b -> a -> b) -> b -> FreeScope a -> b # foldl' :: (b -> a -> b) -> b -> FreeScope a -> b # foldr1 :: (a -> a -> a) -> FreeScope a -> a # foldl1 :: (a -> a -> a) -> FreeScope a -> a # toList :: FreeScope a -> [a] # length :: FreeScope a -> Int # elem :: Eq a => a -> FreeScope a -> Bool # maximum :: Ord a => FreeScope a -> a # minimum :: Ord a => FreeScope a -> a # | |
| Traversable FreeScope Source # | |
Defined in Blanks.UnderScope | |
| Eq a => Eq (FreeScope a) Source # | |
| Show a => Show (FreeScope a) Source # | |
| NFData a => NFData (FreeScope a) Source # | |
Defined in Blanks.UnderScope | |
data UnderScope n f e a Source #
Constructors
| UnderBoundScope !BoundScope | |
| UnderFreeScope !(FreeScope a) | |
| UnderBinderScope !(BinderScope n e) | |
| UnderEmbedScope !(EmbedScope f e) |
Instances
data UnderScopeFold n f e a r Source #
Constructors
| UnderScopeFold | |
Fields
| |
Instances
| Functor (UnderScopeFold n f e a) Source # | |
Defined in Blanks.UnderScope Methods fmap :: (a0 -> b) -> UnderScopeFold n f e a a0 -> UnderScopeFold n f e a b # (<$) :: a0 -> UnderScopeFold n f e a b -> UnderScopeFold n f e a a0 # | |
pattern UnderScopeBound :: Int -> UnderScope n f e a Source #
pattern UnderScopeFree :: a -> UnderScope n f e a Source #
pattern UnderScopeBinder :: Int -> n -> e -> UnderScope n f e a Source #
pattern UnderScopeEmbed :: f e -> UnderScope n f e a Source #
underScopeFold :: UnderScopeFold n f e a r -> UnderScope n f e a -> r Source #
underScopeShift :: Functor f => (Int -> Int -> e -> e) -> Int -> Int -> UnderScope n f e a -> UnderScope n f e a Source #