ema-0.4.0.0: Static site generator library with hot reload
Safe HaskellNone
LanguageHaskell2010

Ema.CLI

Synopsis

Documentation

data Action res where Source #

CLI subcommand

Constructors

Generate :: FilePath -> Action [FilePath] 
Run :: (Host, Port) -> Action () 

Instances

Instances details
GShow Action Source # 
Instance details

Defined in Ema.CLI

Methods

gshowsPrec :: forall (a :: k). Int -> Action a -> ShowS #

GEq Action Source # 
Instance details

Defined in Ema.CLI

Methods

geq :: forall (a :: k) (b :: k). Action a -> Action b -> Maybe (a :~: b) #

GCompare Action Source # 
Instance details

Defined in Ema.CLI

Methods

gcompare :: forall (a :: k) (b :: k). Action a -> Action b -> GOrdering a b #

ArgDict (c :: Type -> Constraint) Action Source # 
Instance details

Defined in Ema.CLI

Associated Types

type ConstraintsFor Action c #

Methods

argDict :: forall (a :: k). ConstraintsFor Action c => Action a -> Dict (c a) #

type ConstraintsFor Action (c :: Type -> Constraint) Source # 
Instance details

Defined in Ema.CLI

type ConstraintsFor Action (c :: Type -> Constraint) = (c [FilePath], c ())

data Cli Source #

Constructors

Cli 

Fields

Instances

Instances details
Eq Cli Source # 
Instance details

Defined in Ema.CLI

Methods

(==) :: Cli -> Cli -> Bool #

(/=) :: Cli -> Cli -> Bool #

Show Cli Source # 
Instance details

Defined in Ema.CLI

Methods

showsPrec :: Int -> Cli -> ShowS #

show :: Cli -> String #

showList :: [Cli] -> ShowS #