| Safe Haskell | None |
|---|---|
| Language | Haskell2010 |
Blanks.Core
Description
Internals.
Documentation
newtype BoundScope Source #
Constructors
| BoundScope | |
Fields
| |
Instances
| Eq BoundScope Source # | |
Defined in Blanks.Core | |
| Show BoundScope Source # | |
Defined in Blanks.Core Methods showsPrec :: Int -> BoundScope -> ShowS # show :: BoundScope -> String # showList :: [BoundScope] -> ShowS # | |
| NFData BoundScope Source # | |
Defined in Blanks.Core Methods rnf :: BoundScope -> () # | |
Constructors
| FreeScope | |
Fields
| |
Instances
| Functor FreeScope Source # | |
| Foldable FreeScope Source # | |
Defined in Blanks.Core Methods fold :: Monoid m => FreeScope m -> m # foldMap :: Monoid m => (a -> m) -> FreeScope a -> 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 # | |
| Eq a => Eq (FreeScope a) Source # | |
| Show a => Show (FreeScope a) Source # | |
| NFData a => NFData (FreeScope a) Source # | |
Defined in Blanks.Core | |
data BinderScope n e Source #
Constructors
| BinderScope | |
Fields
| |
Instances
newtype EmbedScope f e Source #
Constructors
| EmbedScope | |
Fields
| |
Instances
| Functor f => Functor (EmbedScope f) Source # | |
Defined in Blanks.Core 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.Core 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.Core 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.Core Methods rnf :: EmbedScope f e -> () # | |