rf/src/site.hs

166 行
5.0 KiB
Haskell

2018-08-18 07:24:54 -04:00
{-# LANGUAGE OverloadedStrings #-}
2018-08-18 21:17:10 -04:00
import Data.Monoid ((<>))
2018-08-18 07:24:54 -04:00
import Data.List (sortBy,isSuffixOf)
2018-08-25 00:38:47 -04:00
import Data.Typeable
2018-08-18 07:24:54 -04:00
import GHC.IO.Encoding
2018-08-22 21:14:11 -04:00
import Hakyll
import Hakyll.Favicon (faviconsRules, faviconsField)
import System.FilePath.Posix (takeBaseName,takeDirectory,(</>))
2018-08-18 07:24:54 -04:00
2019-06-11 21:59:42 -04:00
2018-08-18 07:24:54 -04:00
main :: IO ()
main = do
2018-08-25 00:38:47 -04:00
-- Set the encoding so w3c doesnt complain
2018-08-18 07:24:54 -04:00
setLocaleEncoding utf8
2019-06-11 21:59:42 -04:00
hakyllWith rfConf $ do
2018-08-25 00:38:47 -04:00
-- Generate the favicons
2018-08-22 21:14:11 -04:00
faviconsRules "icons/favicon.svg"
2018-08-23 00:42:10 -04:00
2018-08-25 00:38:47 -04:00
-- Straight copying of files
match (fromList ["humans.txt", "robots.txt", "fonts/*"]) $ do
2018-08-18 07:24:54 -04:00
route idRoute
compile copyFileCompiler
2018-08-25 00:38:47 -04:00
-- CSS needs to be compiled and minified
2018-08-18 07:24:54 -04:00
match "css/*" $ do
route idRoute
compile compressCssCompiler
2018-08-25 00:38:47 -04:00
-- Load pages that need to be formatted
2018-08-18 07:24:54 -04:00
match (fromList ["about.md", "contact.md"]) $ do
route $ cleanRoute
compile $ pandocCompiler
2018-08-18 21:17:10 -04:00
>>= loadAndApplyTemplate "templates/default.html" ctx
2018-08-18 07:24:54 -04:00
>>= relativizeUrls
>>= cleanIndexUrls
2018-08-25 00:38:47 -04:00
-- Render Atom + Rss feeds
create ["atom.xml"] $ do
route idRoute
(compileFeed renderAtom)
create ["rss.xml"] $ do
route idRoute
(compileFeed renderRss)
-- Compile the templates
match "templates/*" $ compile templateBodyCompiler
-- Compile the archive page and post list
2018-08-18 07:24:54 -04:00
match "archive.md" $ do
route $ cleanRoute
compile $ do
posts <- recentFirst =<< loadAll "posts/*"
let archiveCtx =
2018-08-18 21:17:10 -04:00
listField "posts" postCtx (return posts) <>
ctx
2018-08-18 07:24:54 -04:00
pandocCompiler
>>= loadAndApplyTemplate "templates/archive.html" archiveCtx
>>= loadAndApplyTemplate "templates/default.html" archiveCtx
>>= relativizeUrls
>>= cleanIndexUrls
-- Compile and load posts
match "index.md" $ do
route $ setExtension "html"
2018-08-18 07:24:54 -04:00
compile $ pandocCompiler
>>= loadAndApplyTemplate "templates/index.html" ctx
2018-08-18 07:24:54 -04:00
>>= relativizeUrls
>>= cleanIndexUrls
compile $ do
2018-09-03 18:58:04 -04:00
posts <- (return . (take 5))
=<< recentFirst
=<< loadAll "posts/*"
2018-08-18 07:24:54 -04:00
let indexCtx =
2018-08-22 21:14:11 -04:00
listField "posts" postCtx (return posts) <> ctx
pandocCompiler
2018-08-18 07:24:54 -04:00
>>= applyAsTemplate indexCtx
>>= loadAndApplyTemplate "templates/index.html" indexCtx
2018-08-18 07:24:54 -04:00
>>= loadAndApplyTemplate "templates/default.html" indexCtx
>>= relativizeUrls
>>= cleanIndexUrls
-- Compile posts + save snapshots for the web feeds
match "posts/*" $ do
route $ cleanRoute
compile $ pandocCompiler
>>= loadAndApplyTemplate "templates/post.html" postCtx
>>= saveSnapshot "content"
>>= loadAndApplyTemplate "templates/default.html" postCtx
>>= relativizeUrls
>>= cleanIndexUrls
>>= cleanIndexHtmls
2018-08-18 07:24:54 -04:00
2019-06-11 21:59:42 -04:00
-- Set the input/output directories
rfConf :: Configuration
rfConf = defaultConfiguration
{ destinationDirectory = "_http"
, storeDirectory = "_store"
, tmpDirectory = "_tmp"
, providerDirectory = "_input"
}
2018-08-25 00:38:47 -04:00
-- Agnememnon the Fuck-Upperer - Conquerer of Small Type Declarations
compileFeed ::
(FeedConfiguration
-> Context String
-> [Item String]
-> Compiler (Item String)
) -> Rules ()
-- For those left alive, this abstracts out creating
-- Atom and RSS feeds
compileFeed f = compile $ do
let feedCtx = postCtx <>
bodyField "description"
posts <- fmap (take 10) . recentFirst
=<< loadAllSnapshots "posts/*" "content"
f feedConfig feedCtx posts
-- The configuration for our Atom/RSS feeds
feedConfig :: FeedConfiguration
feedConfig = FeedConfiguration {
feedTitle = "Regular Flolloping"
, feedDescription = "tA's Blog"
, feedAuthorName = "Shaun Kerr"
, feedAuthorEmail = "s@p7.co.nz"
, feedRoot = "https://regularflolloping.com"
}
2018-08-22 21:49:50 -04:00
2018-08-25 00:38:47 -04:00
-- Our default context for pages
2018-08-18 21:17:10 -04:00
ctx :: Context String
2018-08-22 21:14:11 -04:00
ctx = defaultContext <>
faviconsField
2018-08-18 21:17:10 -04:00
2018-08-25 00:38:47 -04:00
-- Default context for posts
2018-08-18 07:24:54 -04:00
postCtx :: Context String
postCtx =
2018-08-18 21:17:10 -04:00
(dateField "date" "%B %e, %Y") <> ctx
2018-08-18 07:24:54 -04:00
2018-08-25 00:38:47 -04:00
-- Functions to convert pages to /name/index.html
2018-08-18 07:24:54 -04:00
cleanRoute :: Routes
cleanRoute = customRoute createIndexRoute
where
createIndexRoute ident =
takeDirectory p </> takeBaseName p </> "index.html"
where p = toFilePath ident
cleanIndexUrls :: Item String -> Compiler (Item String)
cleanIndexUrls = return . fmap (withUrls cleanIndex)
cleanIndexHtmls :: Item String -> Compiler (Item String)
cleanIndexHtmls = return . fmap (replaceAll pattern replacement)
where
pattern = "/index.html"
replacement = const "/"
cleanIndex :: String -> String
cleanIndex url
| idx `isSuffixOf` url = take (length url - length idx) url
| otherwise = url
where idx = "index.html"