Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
SimpleParser.Examples.Lexed.Sexp
Description
Parses S-expressions but lexes first
Documentation
Instances
Foldable SexpF Source # | |
Defined in SimpleParser.Examples.Common.Sexp 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 # | |
Show a => Show (SexpF a) Source # | |
Eq a => Eq (SexpF a) Source # | |
Constructors
AtomIdent !Text | |
AtomString !Text | |
AtomInt !Integer | |
AtomSci !Scientific |
data SexpTokLabel Source #
Constructors
SexpTokLabelIdentStart | |
SexpTokLabelEmbedText !TextLabel |
Instances
Show SexpTokLabel Source # | |
Defined in SimpleParser.Examples.Lexed.Sexp Methods showsPrec :: Int -> SexpTokLabel -> ShowS # show :: SexpTokLabel -> String # showList :: [SexpTokLabel] -> ShowS # | |
Eq SexpTokLabel Source # | |
Defined in SimpleParser.Examples.Lexed.Sexp | |
EmbedTextLabel SexpTokLabel Source # | |
Defined in SimpleParser.Examples.Lexed.Sexp Methods | |
ExplainLabel SexpTokLabel Source # | |
Defined in SimpleParser.Examples.Lexed.Sexp Methods explainLabel :: SexpTokLabel -> Builder Source # explainLabelText :: SexpTokLabel -> Text Source # |
type SexpTokParserC s = (PosStream s, TextualStream s) Source #
type SexpTokParserM s a = Parser SexpTokLabel s Void a Source #
sexpTokParser :: SexpTokParserC s => SexpTokParserM s SexpTok Source #
type SexpParserC s = (Stream s, Token s ~ SexpTok) Source #
sexpParser :: SexpParserC s => SexpParserM s Sexp Source #