| Safe Haskell | Safe | 
|---|---|
| Language | Haskell98 | 
Options.Applicative.Internal
Documentation
Instances
| Monad P Source # | |
| Functor P Source # | |
| Applicative P Source # | |
| Alternative P Source # | |
| MonadPlus P Source # | |
| MonadP P Source # | |
| Defined in Options.Applicative.Internal Methods enterContext :: String -> ParserInfo a -> P () Source # exitContext :: P () Source # getPrefs :: P ParserPrefs Source # missingArgP :: ParseError -> Completer -> P a Source # errorP :: ParseError -> P a Source # exitP :: IsCmdStart -> ArgPolicy -> Parser b -> Maybe a -> P a Source # | |
class (Alternative m, MonadPlus m) => MonadP m where Source #
Methods
enterContext :: String -> ParserInfo a -> m () Source #
exitContext :: m () Source #
getPrefs :: m ParserPrefs Source #
missingArgP :: ParseError -> Completer -> m a Source #
errorP :: ParseError -> m a Source #
exitP :: IsCmdStart -> ArgPolicy -> Parser b -> Maybe a -> m a Source #
Instances
| MonadP Completion Source # | |
| Defined in Options.Applicative.Internal Methods enterContext :: String -> ParserInfo a -> Completion () Source # exitContext :: Completion () Source # getPrefs :: Completion ParserPrefs Source # missingArgP :: ParseError -> Completer -> Completion a Source # errorP :: ParseError -> Completion a Source # exitP :: IsCmdStart -> ArgPolicy -> Parser b -> Maybe a -> Completion a Source # | |
| MonadP P Source # | |
| Defined in Options.Applicative.Internal Methods enterContext :: String -> ParserInfo a -> P () Source # exitContext :: P () Source # getPrefs :: P ParserPrefs Source # missingArgP :: ParseError -> Completer -> P a Source # errorP :: ParseError -> P a Source # exitP :: IsCmdStart -> ArgPolicy -> Parser b -> Maybe a -> P a Source # | |
data ParseError Source #
Constructors
| ErrorMsg String | |
| InfoMsg String | |
| ShowHelpText | |
| UnknownError | |
| MissingError IsCmdStart SomeParser | |
| ExpectsArgError String | |
| UnexpectedError String SomeParser | 
Instances
| Semigroup ParseError Source # | |
| Defined in Options.Applicative.Types Methods (<>) :: ParseError -> ParseError -> ParseError # sconcat :: NonEmpty ParseError -> ParseError # stimes :: Integral b => b -> ParseError -> ParseError # | |
| Monoid ParseError Source # | |
| Defined in Options.Applicative.Types Methods mempty :: ParseError # mappend :: ParseError -> ParseError -> ParseError # mconcat :: [ParseError] -> ParseError # | |
hoistMaybe :: MonadPlus m => Maybe a -> m a Source #
hoistEither :: MonadP m => Either ParseError a -> m a Source #
runP :: P a -> ParserPrefs -> (Either ParseError a, [Context]) Source #
data Completion a Source #
Instances
runCompletion :: Completion r -> ParserPrefs -> Maybe (Either (SomeParser, ArgPolicy) Completer) Source #
contextNames :: [Context] -> [String] Source #
Instances
| MonadTrans NondetT Source # | |
| Defined in Options.Applicative.Internal | |
| Monad m => Monad (NondetT m) Source # | |
| Monad m => Functor (NondetT m) Source # | |
| Monad m => Applicative (NondetT m) Source # | |
| Defined in Options.Applicative.Internal | |
| Monad m => Alternative (NondetT m) Source # | |
| Monad m => MonadPlus (NondetT m) Source # | |