rib-core-1.0.0.0: Static site generator based on Shake

Safe HaskellNone
LanguageHaskell2010

Rib.Cli

Contents

Synopsis

Documentation

data CliConfig Source #

Constructors

CliConfig 

Fields

Instances
Eq CliConfig Source # 
Instance details

Defined in Rib.Cli

Show CliConfig Source # 
Instance details

Defined in Rib.Cli

Generic CliConfig Source # 
Instance details

Defined in Rib.Cli

Associated Types

type Rep CliConfig :: Type -> Type #

type Rep CliConfig Source # 
Instance details

Defined in Rib.Cli

data Verbosity #

The verbosity data type, used by shakeVerbosity.

Constructors

Silent

Don't print any messages.

Error

Only print error messages.

Warn

Print errors and warnings.

Info

Print errors, warnings and # command-name (for file-name) when running a traced command.

Verbose

Print errors, warnings, full command lines when running a command or cmd command and status messages when starting a rule.

Diagnostic

Print messages for virtually everything (mostly for debugging).

Instances
Bounded Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Enum Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Eq Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Data Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Verbosity -> c Verbosity #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Verbosity #

toConstr :: Verbosity -> Constr #

dataTypeOf :: Verbosity -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Verbosity) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Verbosity) #

gmapT :: (forall b. Data b => b -> b) -> Verbosity -> Verbosity #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Verbosity -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Verbosity -> r #

gmapQ :: (forall d. Data d => d -> u) -> Verbosity -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Verbosity -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Verbosity -> m Verbosity #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Verbosity -> m Verbosity #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Verbosity -> m Verbosity #

Ord Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Read Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Show Verbosity 
Instance details

Defined in Development.Shake.Internal.Options

Parser helpers

directoryReader :: ReadM FilePath Source #

Like str but adds a trailing slash if there isn't one.

Internal