optparse-applicative-0.15.1.0: Utilities and combinators for parsing command line options

Safe HaskellSafe
LanguageHaskell98

Options.Applicative.Internal

Documentation

data P a Source #

Instances
Monad P Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: P a -> (a -> P b) -> P b #

(>>) :: P a -> P b -> P b #

return :: a -> P a #

fail :: String -> P a #

Functor P Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> P a -> P b #

(<$) :: a -> P b -> P a #

Applicative P Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> P a #

(<*>) :: P (a -> b) -> P a -> P b #

liftA2 :: (a -> b -> c) -> P a -> P b -> P c #

(*>) :: P a -> P b -> P b #

(<*) :: P a -> P b -> P a #

Alternative P Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: P a #

(<|>) :: P a -> P a -> P a #

some :: P a -> P [a] #

many :: P a -> P [a] #

MonadPlus P Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: P a #

mplus :: P a -> P a -> P a #

MonadP P Source # 
Instance details

Defined in Options.Applicative.Internal

uncons :: [a] -> Maybe (a, [a]) Source #

hoistMaybe :: MonadPlus m => Maybe a -> m a Source #

runReadM :: MonadP m => ReadM a -> String -> m a Source #

data Completion a Source #

Instances
Monad Completion Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: Completion a -> (a -> Completion b) -> Completion b #

(>>) :: Completion a -> Completion b -> Completion b #

return :: a -> Completion a #

fail :: String -> Completion a #

Functor Completion Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> Completion a -> Completion b #

(<$) :: a -> Completion b -> Completion a #

Applicative Completion Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> Completion a #

(<*>) :: Completion (a -> b) -> Completion a -> Completion b #

liftA2 :: (a -> b -> c) -> Completion a -> Completion b -> Completion c #

(*>) :: Completion a -> Completion b -> Completion b #

(<*) :: Completion a -> Completion b -> Completion a #

Alternative Completion Source # 
Instance details

Defined in Options.Applicative.Internal

MonadPlus Completion Source # 
Instance details

Defined in Options.Applicative.Internal

MonadP Completion Source # 
Instance details

Defined in Options.Applicative.Internal

data ListT m a Source #

Instances
MonadTrans ListT Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

lift :: Monad m => m a -> ListT m a #

Monad m => Monad (ListT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: ListT m a -> (a -> ListT m b) -> ListT m b #

(>>) :: ListT m a -> ListT m b -> ListT m b #

return :: a -> ListT m a #

fail :: String -> ListT m a #

Monad m => Functor (ListT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> ListT m a -> ListT m b #

(<$) :: a -> ListT m b -> ListT m a #

Monad m => Applicative (ListT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> ListT m a #

(<*>) :: ListT m (a -> b) -> ListT m a -> ListT m b #

liftA2 :: (a -> b -> c) -> ListT m a -> ListT m b -> ListT m c #

(*>) :: ListT m a -> ListT m b -> ListT m b #

(<*) :: ListT m a -> ListT m b -> ListT m a #

Monad m => Alternative (ListT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: ListT m a #

(<|>) :: ListT m a -> ListT m a -> ListT m a #

some :: ListT m a -> ListT m [a] #

many :: ListT m a -> ListT m [a] #

Monad m => MonadPlus (ListT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: ListT m a #

mplus :: ListT m a -> ListT m a -> ListT m a #

takeListT :: Monad m => Int -> ListT m a -> ListT m a Source #

runListT :: Monad m => ListT m a -> m [a] Source #

data NondetT m a Source #

Instances
MonadTrans NondetT Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

lift :: Monad m => m a -> NondetT m a #

Monad m => Monad (NondetT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

(>>=) :: NondetT m a -> (a -> NondetT m b) -> NondetT m b #

(>>) :: NondetT m a -> NondetT m b -> NondetT m b #

return :: a -> NondetT m a #

fail :: String -> NondetT m a #

Monad m => Functor (NondetT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

fmap :: (a -> b) -> NondetT m a -> NondetT m b #

(<$) :: a -> NondetT m b -> NondetT m a #

Monad m => Applicative (NondetT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

pure :: a -> NondetT m a #

(<*>) :: NondetT m (a -> b) -> NondetT m a -> NondetT m b #

liftA2 :: (a -> b -> c) -> NondetT m a -> NondetT m b -> NondetT m c #

(*>) :: NondetT m a -> NondetT m b -> NondetT m b #

(<*) :: NondetT m a -> NondetT m b -> NondetT m a #

Monad m => Alternative (NondetT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

empty :: NondetT m a #

(<|>) :: NondetT m a -> NondetT m a -> NondetT m a #

some :: NondetT m a -> NondetT m [a] #

many :: NondetT m a -> NondetT m [a] #

Monad m => MonadPlus (NondetT m) Source # 
Instance details

Defined in Options.Applicative.Internal

Methods

mzero :: NondetT m a #

mplus :: NondetT m a -> NondetT m a -> NondetT m a #

cut :: Monad m => NondetT m () Source #

(<!>) :: Monad m => NondetT m a -> NondetT m a -> NondetT m a Source #

disamb :: Monad m => Bool -> NondetT m a -> m (Maybe a) Source #