Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
- class (Monad p, Alternative p) => IsParser p where
- (<?>) :: IsParser p => p a -> String -> p a
- char :: (IsParser p, Show (SymbolOf p), Eq (SymbolOf p)) => SymbolOf p -> p (SymbolOf p)
- noneOf :: (IsParser p, (~) * (SymbolOf p) Char) => [Char] -> p Char
- oneOf :: (IsParser p, (~) * (SymbolOf p) Char) => [Char] -> p Char
- spaces :: (IsParser p, (~) * (SymbolOf p) Char) => p ()
- space :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- newline :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- tab :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- upper :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- lower :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- alphaNum :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- letter :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- digit :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- hexDigit :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- octDigit :: (IsParser p, (~) * (SymbolOf p) Char) => p Char
- anySymbol :: IsParser p => p (SymbolOf p)
- string :: (IsParser p, SymbolOf p ~ Char) => String -> p String
- choice :: Alternative f => [f a] -> f a
- option :: Alternative f => a -> f a -> f a
- between :: Applicative m => m x -> m y -> m a -> m a
- manyGreedy :: IsParser m => m a -> m [a]
- skipMany1 :: Alternative f => f a -> f ()
- skipMany :: Alternative f => f a -> f ()
- sepBy :: Alternative f => f a -> f a1 -> f [a]
- sepBy1 :: Alternative f => f a -> f a1 -> f [a]
- count :: Applicative m => Int -> m a -> m [a]
- chainr :: (Monad f, Alternative f) => f a -> f (a -> a -> a) -> a -> f a
- chainl :: (Monad f, Alternative f) => f a -> f (a -> a -> a) -> a -> f a
- chainr1 :: (Monad m, Alternative m) => m t -> m (t -> t -> t) -> m t
- chainl1 :: (Monad m, Alternative m) => m b -> m (b -> b -> b) -> m b
- munch :: IsParser m => (SymbolOf m -> Bool) -> m [SymbolOf m]
- munch1 :: IsParser m => (SymbolOf m -> Bool) -> m [SymbolOf m]
- endOfFile :: (IsParser p, MonadPlus p) => p ()
Documentation
class (Monad p, Alternative p) => IsParser p where Source
Parser class
choice :: Alternative f => [f a] -> f a Source
option :: Alternative f => a -> f a -> f a Source
between :: Applicative m => m x -> m y -> m a -> m a Source
manyGreedy :: IsParser m => m a -> m [a] Source
Greedy repetition: match as many occurences as possible of the argument.
skipMany1 :: Alternative f => f a -> f () Source
skipMany :: Alternative f => f a -> f () Source
sepBy :: Alternative f => f a -> f a1 -> f [a] Source
sepBy1 :: Alternative f => f a -> f a1 -> f [a] Source
count :: Applicative m => Int -> m a -> m [a] Source
chainr :: (Monad f, Alternative f) => f a -> f (a -> a -> a) -> a -> f a Source
chainl :: (Monad f, Alternative f) => f a -> f (a -> a -> a) -> a -> f a Source
chainr1 :: (Monad m, Alternative m) => m t -> m (t -> t -> t) -> m t Source
chainl1 :: (Monad m, Alternative m) => m b -> m (b -> b -> b) -> m b Source