quick-process
Safe HaskellNone
LanguageGHC2024

System.Process.Quick.CallArgument

Synopsis

Documentation

class Arbitrary a => CallArgument a where Source #

Minimal complete definition

Nothing

Methods

toExecString :: a -> [String] Source #

default toExecString :: Show a => a -> [String] Source #

Instances

Instances details
CallArgument Integer Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument String Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument () Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: () -> [String] Source #

CallArgument Bool Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument Double Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument Float Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument Int Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: Int -> [String] Source #

CallArgument Word Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument a => CallArgument (NonEmpty a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgument a => CallArgument (Maybe a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: Maybe a -> [String] Source #

CallArgument a => CallArgument [a] Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: [a] -> [String] Source #

(CallArgument a, CallArgument b) => CallArgument (Either a b) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: Either a b -> [String] Source #

(Typeable a, Predicate c a, CallArgument a) => CallArgument (Refined c a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

toExecString :: Refined c a -> [String] Source #

type NeList = NonEmpty Source #

Disambiguate NonEmpty

newtype QR a Source #

Constructors

QR 

Fields

Instances

Instances details
Applicative QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

pure :: a -> QR a #

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

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

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

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

Functor QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

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

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

Monad QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

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

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

return :: a -> QR a #

MonadFail QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

fail :: String -> QR a #

Quote QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

newName :: String -> QR Name #

MonadWriter [Dec] QR Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

writer :: (a, [Dec]) -> QR a #

tell :: [Dec] -> QR () #

listen :: QR a -> QR (a, [Dec]) #

pass :: QR (a, [Dec] -> [Dec]) -> QR a #

class Typeable a => CallArgumentGen a where Source #

Minimal complete definition

cArgName, progArgExpr, fieldExpr, initCallSpecsExpr

Methods

cArgName :: a -> Maybe String Source #

field name in the record; constant value does not have a field

progArgExpr :: a -> QR Exp Source #

lambda expression projecting a call argument in CallSpec record to a list of strings Exp type is 'v -> [String]'

fieldExpr :: a -> QR (Maybe VarBangType) Source #

TH field definition of call argument in CallSpec record

outcomeCheckersExpr :: a -> QR Exp Source #

Exp type is 'v -> [OutcomeChecker]'

initCallSpecsExpr :: a -> QR Exp Source #

Exp type is 'v -> m [CsBox]'

Instances

Instances details
CallArgumentGen ConstArg Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgumentGen ConstArgs Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgumentGen OutcomeChecker Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallArgumentGen Subcases Source # 
Instance details

Defined in System.Process.Quick.CallSpec.Subcases

(Typeable a, CallArgument a) => CallArgumentGen (KeyArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

(Typeable a, CallArgument a) => CallArgumentGen (VarArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

CallSpec cs => CallArgumentGen (Init cs) Source # 
Instance details

Defined in System.Process.Quick.CallSpec.Init

mapFirst :: (a -> a) -> [a] -> [a] Source #

newtype VarArg (a :: k) Source #

Command line argument without preceeding key

Constructors

VarArg String 

Instances

Instances details
Show (VarArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

showsPrec :: Int -> VarArg a -> ShowS #

show :: VarArg a -> String #

showList :: [VarArg a] -> ShowS #

Eq (VarArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

(==) :: VarArg a -> VarArg a -> Bool #

(/=) :: VarArg a -> VarArg a -> Bool #

(Typeable a, CallArgument a) => CallArgumentGen (VarArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

newtype KeyArg (a :: k) Source #

Command line argument prefixed with a key

Constructors

KeyArg String 

Instances

Instances details
Show (KeyArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

showsPrec :: Int -> KeyArg a -> ShowS #

show :: KeyArg a -> String #

showList :: [KeyArg a] -> ShowS #

Eq (KeyArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument

Methods

(==) :: KeyArg a -> KeyArg a -> Bool #

(/=) :: KeyArg a -> KeyArg a -> Bool #

(Typeable a, CallArgument a) => CallArgumentGen (KeyArg a) Source # 
Instance details

Defined in System.Process.Quick.CallArgument