her.esy.fun/Shakefile.hs
Yann Esposito (Yogsototh) 1eb4a6de5a
save
2020-06-22 09:39:44 +02:00

115 lines
3.8 KiB
Haskell

{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE NoImplicitPrelude #-}
import Protolude hiding ((*>))
import Development.Shake
import Development.Shake.Command
import Development.Shake.FilePath
import Development.Shake.Util
import Data.Default (Default(def))
import qualified Data.Set as Set
import qualified Data.Text as T
import Text.Pandoc.Class (PandocPure,PandocMonad)
import qualified Text.Pandoc.Class as Pandoc
import Text.Pandoc.Definition (Pandoc(..),Block(..),Inline,nullMeta,docTitle,docDate,docAuthors)
import Text.Pandoc.Extensions (getDefaultExtensions)
import Text.Pandoc.Options (ReaderOptions(..),TrackChanges(RejectChanges))
import qualified Text.Pandoc.Readers as Readers
import qualified Text.Pandoc.Writers as Writers
main :: IO ()
main = do
let shOpts = shakeOptions { shakeVerbosity = Chatty, shakeLintInside = ["\\"] }
shakeArgs shOpts buildRules
data BlogPost =
BlogPost { postTitle :: T.Text
, postDate :: T.Text
, postAuthors :: [T.Text]
, postUrl :: FilePath
, postP :: Pandoc
}
inlineToText :: PandocMonad m => [Inline] -> m T.Text
inlineToText inline =
Writers.writeAsciiDoc def (Pandoc nullMeta [Plain inline])
buildRules :: Rules ()
buildRules = do
let
siteDir = "_site"
optimDir = "_optim"
build = (</>) siteDir
phony "clean" $ do
putInfo "Cleaning files in _site and _optim"
removeFilesAfter siteDir ["//*"]
removeFilesAfter optimDir ["//*"]
getPost <- newCache $ \path -> do
fileContent <- readFile' path
eitherResult <- liftIO $ Pandoc.runIO $ Readers.readOrg def (T.pack fileContent)
case eitherResult of
Left _ -> liftIO $ putText "Problem"
Right pandoc@(Pandoc meta _) -> liftIO $ Pandoc.runIO $ do
title <- inlineToText $ docTitle meta
date <- inlineToText $ docDate meta
authors <- map inlineToText $ docAuthors meta
let url = dropExtension path
return $ BlogPost title date authors url pandoc
getPosts <- newCache $ \() ->
mapM getPost =<< getDirectoryFiles "" ["src/posts//*.org"]
let hsDeps = return ["AsciiArt.hs", "Index.hs", "Rot13.hs"]
cssDeps = map (siteDir </>) <$> getDirectoryFiles "" ["src/css/*.css"]
build "index.html" *> \out -> do
hs <- hsDeps
css <- cssDeps
posts <- getPosts ()
need $ hs
<> css
<> map ( combine "build"
. flip combine "index.html"
. postUrl ) posts
<> [build "atom.xml"]
writeFile' out
. renderHtml . index ""
. sortBy (\a b ->
compare (Down (postDate a)) (Down (postDate b)))
$ posts
build "src/css/*.css" *> \out ->
copyFile' (dropDirectory1 out) out
-- "_site//*.html" %> buildPost
-- buildPosts
-- allPosts <- buildPosts
-- buildIndex allPosts
-- buildFeed allPosts
-- copyStaticFiles
-- data Post = Post { postTitle :: T.Text
-- , postAuthor :: T.Text
-- , postDate :: T.Text
-- }
--
-- defaultReaderOpts t =
-- def { readerExtensions = getDefaultExtensions t
-- , readerStandalone = True }
--
-- orgToHTML :: T.Text -> PandocPure T.Text
-- orgToHTML txt = Readers.readOrg (defaultReaderOpts "org") txt
-- >>= Writers.writeHtml5String def
--
-- -- | Load a post, process metadata, write it to output, then return the post object
-- -- Detects changes to either post content or template
-- buildPost :: FilePath -> Action ()
-- buildPost out = do
-- let org = "src/" <> (dropDirectory1 $ out -<.> "org")
-- liftIO . putStrLn $ "Rebuilding post: " <> out
-- postContent <- readFile' org
-- -- load post content and metadata as JSON blob
-- let pandocReturn = Pandoc.runPure $ orgToHTML . T.pack $ postContent
-- case pandocReturn of
-- Left _ -> putError "BAD"
-- Right outData -> writeFile' out (T.unpack outData)