hablo/src/Dom.hs

108 lines
3.3 KiB
Haskell
Raw Normal View History

2019-01-27 21:41:21 +01:00
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
module Dom (
page
2019-01-27 21:41:21 +01:00
) where
import Article (Article(..))
2019-02-15 14:13:43 +01:00
import qualified Article (preview)
import ArticlesList (ArticlesList(..), otherLink, otherUrl, pageTitle)
import Blog (Blog(..), Path(..), Skin(..))
import qualified Blog (get)
import Control.Monad.Reader (ReaderT)
import qualified Data.Map as Map (keys)
2019-02-06 12:57:57 +01:00
import Data.Monoid ((<>))
2019-01-27 21:41:21 +01:00
import Data.Text (pack, empty)
import Lucid
2019-02-06 12:57:57 +01:00
import Lucid.Base (makeAttribute)
import Prelude hiding (head)
import Pretty ((.$))
import System.FilePath.Posix ((</>), (<.>))
type HtmlGenerator = HtmlT (ReaderT Blog IO)
2019-01-27 21:41:21 +01:00
class Page a where
2019-02-06 12:57:57 +01:00
card :: a -> HtmlGenerator ()
content :: a -> HtmlGenerator ()
instance Page Article where
2019-02-06 12:57:57 +01:00
card (Article {title}) =
("A new article on " <>) <$> Blog.get name
>>= makeCard title
2019-02-15 14:13:43 +01:00
content = article True
instance Page ArticlesList where
2019-02-06 12:57:57 +01:00
card al = do
blogName <- Blog.get name
makeCard (maybe blogName ((blogName ++ " - ") ++) $ tagged al) (pageTitle al)
content al@(ArticlesList {featured}) = do
2019-02-15 14:13:43 +01:00
preview <- Article.preview <$> (Blog.get $skin.$previewLinesCount)
h2_ . toHtml . pack $ pageTitle al
navigationA [href_ . pack $ otherUrl al] . toHtml . pack $ otherLink al
2019-02-15 14:13:43 +01:00
div_ [class_ "articles"] (
mapM_ (article False . preview) featured
)
article :: Bool -> Article -> HtmlGenerator ()
article raw (Article {key, body, title}) = do
url <- ("/" </>) . (</> key <.> extension) <$> (Blog.get $path.$articlesPath)
2019-02-15 14:13:43 +01:00
article_ (do
header_ (do
aElem [href_ . pack $ url] . h1_ $ toHtml title
2019-02-15 14:13:43 +01:00
)
pre_ . toHtml $ unlines body
)
where
(aElem, extension) = if raw then (a_, "md") else (navigationA, "html")
2019-02-06 12:57:57 +01:00
makeCard :: String -> String -> HtmlGenerator ()
makeCard title description = do
og "title" title
og "description" description
og "image" =<< (Blog.get $skin.$cardImage)
og "site_name" =<< Blog.get name
2019-02-06 12:57:57 +01:00
where
og attribute value = meta_ [makeAttribute "property" $ "og:" <> attribute , content_ $ pack value]
navigationA :: Term arg result => arg -> result
navigationA = "a" `termWith` [class_ "navigation"]
tag :: String -> HtmlGenerator ()
tag tagName = li_ (navigationA [href_ $ pack ("/" </> tagName)] $ toHtml tagName)
defaultBanner :: HtmlGenerator ()
defaultBanner = do
div_ [id_ "header"] (
navigationA [href_ "/"] (
h1_ . toHtml =<< Blog.get name
)
)
2019-01-27 21:41:21 +01:00
faviconLink :: FilePath -> HtmlGenerator ()
faviconLink url = link_ [rel_ "shortcut icon", href_ $ pack url, type_ "image/x-icon"]
page :: Page a => a -> HtmlGenerator ()
page aPage =
2019-01-27 21:41:21 +01:00
doctypehtml_ (do
head_ (do
meta_ [charset_ "utf-8"]
title_ . toHtml =<< Blog.get name
2019-02-15 14:13:43 +01:00
script_ [src_ "/js/unit.js"] empty
script_ [src_ "/js/remarkable.min.js"] empty
script_ [src_ "/js/hablo.js"] empty
maybe (toHtml empty) faviconLink =<< (Blog.get $skin.$favicon)
2019-02-06 12:57:57 +01:00
card aPage
(Blog.get $skin.$head) >>= maybe (toHtml empty) toHtmlRaw
2019-01-27 21:41:21 +01:00
)
body_ (do
(Blog.get $skin.$banner) >>= maybe defaultBanner toHtmlRaw
2019-01-27 21:41:21 +01:00
div_ [id_ "navigator"] (do
h2_ "Tags"
ul_ . mapM_ tag . Map.keys =<< Blog.get tags
2019-01-27 21:41:21 +01:00
)
div_ [id_ "contents"] $ content aPage
2019-01-27 21:41:21 +01:00
)
)