hakyll/src/Hakyll/Core/Rules.hs

143 lines
4.9 KiB
Haskell
Raw Normal View History

2011-02-11 12:30:55 +00:00
-- | This module provides a declarative DSL in which the user can specify the
-- different rules used to run the compilers.
--
-- The convention is to just list all items in the 'RulesM' monad, routes and
-- compilation rules.
--
-- A typical usage example would be:
--
-- > main = hakyll $ do
-- > route "posts/*" (setExtension "html")
-- > compile "posts/*" someCompiler
2010-12-25 18:37:21 +00:00
--
2011-01-30 09:44:42 +00:00
{-# LANGUAGE GeneralizedNewtypeDeriving, OverloadedStrings #-}
2010-12-25 18:37:21 +00:00
module Hakyll.Core.Rules
2011-02-11 12:30:55 +00:00
( RulesM
2010-12-25 18:37:21 +00:00
, Rules
, compile
, create
, route
2011-01-30 09:44:42 +00:00
, metaCompile
, metaCompileWith
2010-12-25 18:37:21 +00:00
) where
2011-02-11 12:30:55 +00:00
import Control.Applicative ((<$>))
import Control.Monad.Writer (tell)
import Control.Monad.Reader (ask)
2011-01-07 11:12:13 +00:00
import Control.Arrow (second, (>>>), arr, (>>^))
2011-02-11 12:30:55 +00:00
import Control.Monad.State (get, put)
import Data.Monoid (mempty)
2011-02-15 17:32:55 +00:00
import qualified Data.Set as S
2010-12-28 10:12:45 +00:00
import Data.Typeable (Typeable)
import Data.Binary (Binary)
2010-12-25 18:37:21 +00:00
import Hakyll.Core.ResourceProvider
import Hakyll.Core.Identifier
import Hakyll.Core.Identifier.Pattern
2011-01-07 11:12:13 +00:00
import Hakyll.Core.Compiler.Internal
2011-02-03 15:07:49 +00:00
import Hakyll.Core.Routes
2010-12-28 10:12:45 +00:00
import Hakyll.Core.CompiledItem
import Hakyll.Core.Writable
2011-02-11 12:30:55 +00:00
import Hakyll.Core.Rules.Internal
import Hakyll.Core.Util.Arrow
2010-12-25 18:37:21 +00:00
-- | Add a route
--
2011-02-03 15:07:49 +00:00
tellRoute :: Routes -> Rules
2011-02-15 17:32:55 +00:00
tellRoute route' = RulesM $ tell $ RuleSet route' mempty mempty
2010-12-25 18:37:21 +00:00
-- | Add a number of compilers
--
2011-01-07 11:12:13 +00:00
tellCompilers :: (Binary a, Typeable a, Writable a)
2010-12-29 21:59:38 +00:00
=> [(Identifier, Compiler () a)]
2010-12-28 10:12:45 +00:00
-> Rules
2011-02-15 17:32:55 +00:00
tellCompilers compilers = RulesM $ tell $ RuleSet mempty compilers' mempty
2010-12-28 10:12:45 +00:00
where
2011-02-15 17:32:55 +00:00
compilers' = map (second boxCompiler) compilers
2011-01-07 13:34:31 +00:00
boxCompiler = (>>> arr compiledItem >>> arr CompileRule)
2010-12-25 18:37:21 +00:00
2011-02-15 17:32:55 +00:00
-- | Add resources
--
tellResources :: [Resource]
-> Rules
tellResources resources = RulesM $ tell $ RuleSet mempty mempty $ S.fromList resources
2011-02-11 12:30:55 +00:00
-- | Add a compilation rule to the rules.
2010-12-25 18:37:21 +00:00
--
-- This instructs all resources matching the given pattern to be compiled using
2011-02-11 12:30:55 +00:00
-- the given compiler. When no resources match the given pattern, nothing will
-- happen. In this case, you might want to have a look at 'create'.
2010-12-25 18:37:21 +00:00
--
2010-12-28 10:12:45 +00:00
compile :: (Binary a, Typeable a, Writable a)
=> Pattern -> Compiler Resource a -> Rules
2010-12-25 18:37:21 +00:00
compile pattern compiler = RulesM $ do
identifiers <- matches pattern . map unResource . resourceList <$> ask
2011-02-15 17:32:55 +00:00
unRulesM $ do
tellCompilers $ flip map identifiers $ \identifier ->
(identifier, constA (Resource identifier) >>> compiler)
tellResources $ map Resource identifiers
2010-12-25 18:37:21 +00:00
-- | Add a compilation rule
--
2011-02-11 12:30:55 +00:00
-- This sets a compiler for the given identifier. No resource is needed, since
-- we are creating the item from scratch.
2010-12-25 18:37:21 +00:00
--
2010-12-28 10:12:45 +00:00
create :: (Binary a, Typeable a, Writable a)
2010-12-29 21:59:38 +00:00
=> Identifier -> Compiler () a -> Rules
2011-01-07 11:12:13 +00:00
create identifier compiler = tellCompilers [(identifier, compiler)]
2010-12-25 18:37:21 +00:00
2011-02-11 12:30:55 +00:00
-- | Add a route.
--
-- This adds a route for all items matching the given pattern.
2010-12-25 18:37:21 +00:00
--
2011-02-03 15:07:49 +00:00
route :: Pattern -> Routes -> Rules
2011-01-07 11:12:13 +00:00
route pattern route' = tellRoute $ ifMatch pattern route'
2011-02-11 12:30:55 +00:00
-- | Apart from regular compilers, one is also able to specify metacompilers.
-- Metacompilers are a special class of compilers: they are compilers which
-- produce other compilers.
--
-- And indeed, we can see that the first argument to 'metaCompile' is a
-- 'Compiler' which produces a list of ('Identifier', 'Compiler') pairs. The
-- idea is simple: 'metaCompile' produces a list of compilers, and the
-- corresponding identifiers.
--
-- For simple hakyll systems, it is no need for this construction. More
-- formally, it is only needed when the content of one or more items determines
-- which items must be rendered.
2011-01-07 11:12:13 +00:00
--
2011-01-30 09:44:42 +00:00
metaCompile :: (Binary a, Typeable a, Writable a)
=> Compiler () [(Identifier, Compiler () a)]
-- ^ Compiler generating the other compilers
-> Rules
-- ^ Resulting rules
metaCompile compiler = RulesM $ do
-- Create an identifier from the state
state <- get
let index = rulesMetaCompilerIndex state
id' = fromCaptureString "Hakyll.Core.Rules.metaCompile/*" (show index)
-- Update the state with a new identifier
put $ state {rulesMetaCompilerIndex = index + 1}
-- Fallback to 'metaCompileWith' with now known identifier
unRulesM $ metaCompileWith id' compiler
-- | Version of 'metaCompile' that allows you to specify a custom identifier for
-- the metacompiler.
--
metaCompileWith :: (Binary a, Typeable a, Writable a)
=> Identifier
-- ^ Identifier for this compiler
-> Compiler () [(Identifier, Compiler () a)]
-- ^ Compiler generating the other compilers
-> Rules
-- ^ Resulting rules
2011-02-15 17:32:55 +00:00
metaCompileWith identifier compiler = RulesM $ tell $
RuleSet mempty compilers mempty
2011-01-07 11:12:13 +00:00
where
2011-01-07 18:17:14 +00:00
makeRule = MetaCompileRule . map (second box)
2011-02-15 17:32:55 +00:00
compilers = [(identifier, compiler >>> arr makeRule )]
2011-01-07 18:17:14 +00:00
box = (>>> fromDependency identifier >>^ CompileRule . compiledItem)