summaryrefslogtreecommitdiff
path: root/src
diff options
context:
space:
mode:
authorGregor Kleen <gkleen@yggdrasil.li>2015-08-03 12:49:29 +0200
committerGregor Kleen <gkleen@yggdrasil.li>2015-08-03 12:49:29 +0200
commit230688a0b842cf57b316a7ba62910ca387afbce7 (patch)
tree6367087d25147335972cacf19bd34fb868863fd7 /src
parent7170488c37105691f4a690cbcf1e43000d779b59 (diff)
downloaddirty-haskell.org-230688a0b842cf57b316a7ba62910ca387afbce7.tar
dirty-haskell.org-230688a0b842cf57b316a7ba62910ca387afbce7.tar.gz
dirty-haskell.org-230688a0b842cf57b316a7ba62910ca387afbce7.tar.bz2
dirty-haskell.org-230688a0b842cf57b316a7ba62910ca387afbce7.tar.xz
dirty-haskell.org-230688a0b842cf57b316a7ba62910ca387afbce7.zip
Start of complete rewrite to switch to hakyll
Diffstat (limited to 'src')
-rw-r--r--src/Site.hs16
1 files changed, 16 insertions, 0 deletions
diff --git a/src/Site.hs b/src/Site.hs
new file mode 100644
index 0000000..d1afbce
--- /dev/null
+++ b/src/Site.hs
@@ -0,0 +1,16 @@
1{-# LANGUAGE OverloadedStrings #-}
2
3import Hakyll
4
5main :: IO ()
6main = hakyllWith config $ do
7 match "/posts/*" $ do
8 route $ setExtension ".html"
9 compile $ do
10 pandocCompiler
11 >>= saveSnapshot "content"
12 >>= loadAndApplyTemplate "templates/default.html" defaultContext
13 >>= relativizeUrls
14
15config :: Configuration
16config = defaultConfiguration