| Safe Haskell | Safe-Inferred |
|---|---|
| Language | GHC2021 |
Mello.Syntax
Synopsis
- newtype Sym = Sym {}
- data Atom
- data AtomType
- data Brace
- newtype Doc = Doc {}
- data SexpF r
- = SexpAtomF !Atom
- | SexpListF !Brace !(Seq r)
- | SexpQuoteF r
- | SexpUnquoteF r
- | SexpDocF !Doc r
- newtype Sexp = Sexp {}
- data SexpType
- pattern SexpAtom :: Atom -> Sexp
- pattern SexpList :: Brace -> Seq Sexp -> Sexp
- pattern SexpQuote :: Sexp -> Sexp
- pattern SexpUnquote :: Sexp -> Sexp
- pattern SexpDoc :: Doc -> Sexp -> Sexp
Documentation
Leaves of S-expression trees
Constructors
| AtomTypeSym | |
| AtomTypeInt | |
| AtomTypeSci | |
| AtomTypeStr | |
| AtomTypeChar |
Instances
| Bounded AtomType Source # | |
| Enum AtomType Source # | |
| Show AtomType Source # | |
| Eq AtomType Source # | |
| Ord AtomType Source # | |
Defined in Mello.Syntax | |
Constructors
| BraceParen | |
| BraceCurly | |
| BraceSquare |
An S-expression
Constructors
| SexpAtomF !Atom | |
| SexpListF !Brace !(Seq r) | |
| SexpQuoteF r | |
| SexpUnquoteF r | |
| SexpDocF !Doc r |
Instances
| Foldable SexpF Source # | |
Defined in Mello.Syntax Methods fold :: Monoid m => SexpF m -> m # foldMap :: Monoid m => (a -> m) -> SexpF a -> m # foldMap' :: Monoid m => (a -> m) -> SexpF a -> m # foldr :: (a -> b -> b) -> b -> SexpF a -> b # foldr' :: (a -> b -> b) -> b -> SexpF a -> b # foldl :: (b -> a -> b) -> b -> SexpF a -> b # foldl' :: (b -> a -> b) -> b -> SexpF a -> b # foldr1 :: (a -> a -> a) -> SexpF a -> a # foldl1 :: (a -> a -> a) -> SexpF a -> a # elem :: Eq a => a -> SexpF a -> Bool # maximum :: Ord a => SexpF a -> a # minimum :: Ord a => SexpF a -> a # | |
| Traversable SexpF Source # | |
| Functor SexpF Source # | |
| Monad m => MatchSexp e k m (Memo SexpF k) Source # | |
| IsString (SexpF r) Source # | |
Defined in Mello.Syntax Methods fromString :: String -> SexpF r # | |
| Num (SexpF a) Source # | |
| Show r => Show (SexpF r) Source # | |
| Eq r => Eq (SexpF r) Source # | |
| Ord r => Ord (SexpF r) Source # | |
| Pretty r => Pretty (SexpF r) Source # | |
Defined in Mello.Syntax | |
Instances
Constructors
| SexpTypeAtom !AtomType | |
| SexpTypeList !Brace | |
| SexpTypeQuote | |
| SexpTypeUnquote | |
| SexpTypeDoc |
pattern SexpUnquote :: Sexp -> Sexp Source #