{-|
Module      : Slick.Shake
Description : Slick utilities for working with shake
Copyright   : (c) Chris Penner, 2019
License     : BSD3
-}
module Slick.Shake
    ( slick
    , slickWithOpts
    ) where

import Development.Shake
import Development.Shake.Forward

-- | Build your slick site. This is a good candidate for your 'main' function.
--
-- Calls through to 'shakeArgsForward' with extra verbosity
slick :: Action () -> IO ()
slick :: Action () -> IO ()
slick Action ()
buildAction =
    ShakeOptions -> Action () -> IO ()
slickWithOpts (ShakeOptions
shakeOptions { shakeVerbosity :: Verbosity
shakeVerbosity = Verbosity
Chatty }) Action ()
buildAction

-- | Build your slick site with the provided shake options. This is a good candidate for your 'main' function.
--
-- | Calls through to 'shakeArgsForward' with the provided options
slickWithOpts :: ShakeOptions -> Action () -> IO ()
slickWithOpts :: ShakeOptions -> Action () -> IO ()
slickWithOpts ShakeOptions
opts Action ()
buildAction =
    ShakeOptions -> Action () -> IO ()
shakeArgsForward ShakeOptions
opts Action ()
buildAction