2020-07-12 02:18:11 +00:00
|
|
|
{-# LANGUAGE DuplicateRecordFields #-}
|
|
|
|
{-# LANGUAGE DisambiguateRecordFields #-}
|
|
|
|
{-# LANGUAGE NamedFieldPuns #-}
|
|
|
|
{-# LANGUAGE RecordWildCards #-}
|
2020-06-13 16:22:47 +00:00
|
|
|
|
|
|
|
module Templates where
|
|
|
|
|
2020-07-12 02:18:11 +00:00
|
|
|
import Control.Monad (forM_, when)
|
2020-06-13 16:22:47 +00:00
|
|
|
|
|
|
|
import Text.Blaze.Internal as I
|
|
|
|
import Text.Blaze.Html5 as H
|
|
|
|
import Text.Blaze.Html5.Attributes as A
|
|
|
|
import Data.Dates.Types (DateTime(..), months, capitalize)
|
2020-09-25 23:45:58 +00:00
|
|
|
import Data.Time.Format (formatTime, defaultTimeLocale)
|
|
|
|
import Data.Time.LocalTime (zonedTimeToUTC)
|
2020-06-13 16:22:47 +00:00
|
|
|
|
2020-07-12 02:18:11 +00:00
|
|
|
import Types
|
2020-09-25 23:45:58 +00:00
|
|
|
import Common
|
|
|
|
import Config
|
2020-06-13 16:22:47 +00:00
|
|
|
import qualified Data.Map.Strict as Map
|
|
|
|
|
|
|
|
showDate :: DateTime -> String
|
|
|
|
showDate (DateTime y m d _ _ _) = month <> " " <> show d <> ", " <> show y
|
2020-07-12 02:18:11 +00:00
|
|
|
where month = take 3 $ capitalize (months !! (m - 1))
|
2020-06-13 16:22:47 +00:00
|
|
|
|
|
|
|
loading :: AttributeValue -> Attribute
|
|
|
|
loading = I.customAttribute "loading"
|
|
|
|
|
2020-07-12 02:18:11 +00:00
|
|
|
property :: AttributeValue -> Attribute
|
|
|
|
property = I.customAttribute "property"
|
|
|
|
|
2020-06-13 16:22:47 +00:00
|
|
|
toLink :: FilePath -> Html -> Html
|
|
|
|
toLink url = H.a ! A.href (fromString $ "/" <> url)
|
|
|
|
|
|
|
|
|
|
|
|
renderIndex :: [Timestamped (String, FilePath)] -> Html -> Html
|
|
|
|
renderIndex posts content =
|
|
|
|
outer do
|
|
|
|
content
|
|
|
|
H.h2 "Latest notes"
|
2020-07-12 02:18:11 +00:00
|
|
|
H.ul ! A.id "pidx" $ forM_ posts \(Timestamped d (title, src)) ->
|
2020-06-13 16:22:47 +00:00
|
|
|
H.li do
|
2020-07-12 02:18:11 +00:00
|
|
|
H.span $ fromString $ showDate d
|
2020-06-13 16:22:47 +00:00
|
|
|
toLink src (fromString title)
|
|
|
|
|
|
|
|
renderPost :: String -> FilePath -> Html -> Html
|
|
|
|
renderPost title source content =
|
2020-09-25 23:45:58 +00:00
|
|
|
outerWith def { Config.title = fromString title } do
|
2020-06-13 16:22:47 +00:00
|
|
|
H.h1 $ fromString title
|
|
|
|
toLink source "View source"
|
|
|
|
content
|
|
|
|
|
|
|
|
renderVisual :: Html -> [Timestamped FilePath] -> Html
|
|
|
|
renderVisual txt imgs =
|
|
|
|
outer do
|
|
|
|
txt
|
|
|
|
H.hr
|
|
|
|
H.section $ forM_ imgs \ (Timestamped _ p) ->
|
|
|
|
H.figure $ H.img ! A.src (fromString p)
|
|
|
|
! loading "lazy"
|
|
|
|
|
2020-07-12 02:18:11 +00:00
|
|
|
renderProject :: Project -> [(String, FilePath)] -> Html -> Html
|
|
|
|
renderProject (project@Project{title,..}) children content =
|
2020-09-25 23:45:58 +00:00
|
|
|
outerWith def { Config.title = fromString title
|
|
|
|
, Config.description = fromString subtitle
|
|
|
|
} do
|
2020-06-13 16:22:47 +00:00
|
|
|
H.header ! A.class_ "project" $ do
|
|
|
|
H.div $ H.img ! A.src "logo.svg"
|
|
|
|
H.div do
|
2020-07-12 02:18:11 +00:00
|
|
|
H.h1 $ fromString $ title
|
|
|
|
H.p $ fromString $ subtitle
|
|
|
|
H.ul $ forM_ (Map.toList labels) \(k, v) -> H.li do
|
2020-06-13 16:22:47 +00:00
|
|
|
fromString k <> ": "
|
|
|
|
if k == "repo" then
|
|
|
|
H.a ! A.href (fromString $ "https://github.com/" <> v)
|
|
|
|
$ fromString v
|
|
|
|
else fromString v
|
2020-07-12 02:18:11 +00:00
|
|
|
when (length children > 0) $
|
2020-09-25 23:45:58 +00:00
|
|
|
H.ol ! A.class_ "pages" $ forM_ children \(t,l) ->
|
2020-07-12 02:18:11 +00:00
|
|
|
H.li $ H.a ! A.href (fromString l) $ (fromString t)
|
2020-06-13 16:22:47 +00:00
|
|
|
content
|
|
|
|
|
2020-09-25 23:45:58 +00:00
|
|
|
renderReadings :: [Book] -> Html
|
|
|
|
renderReadings books =
|
|
|
|
outerWith def { Config.title = "readings"
|
|
|
|
, Config.description = "books I've read"
|
|
|
|
} do
|
|
|
|
H.table ! A.class_ "books" $
|
|
|
|
forM_ books \ Book {title,author,rating,completed} ->
|
|
|
|
H.tr do
|
|
|
|
H.td $ toHtml title
|
|
|
|
H.td $ toHtml author
|
|
|
|
H.td $ fromString $ case rating of
|
|
|
|
Just r -> replicate r '★'
|
|
|
|
Nothing -> "·"
|
|
|
|
H.td $ fromString $ case completed of
|
|
|
|
Just d -> formatTime defaultTimeLocale "%m/%0Y"
|
|
|
|
$ zonedTimeToUTC d
|
|
|
|
Nothing -> "·"
|
|
|
|
|
2020-06-13 16:22:47 +00:00
|
|
|
renderProjects :: Html -> [(Project, FilePath)] -> Html
|
|
|
|
renderProjects txt paths =
|
|
|
|
outer do
|
|
|
|
txt
|
|
|
|
H.ul ! A.class_ "projects" $ do
|
2020-09-25 23:45:58 +00:00
|
|
|
forM_ paths \(Project {title,..}, link) -> H.li $ H.a ! A.href (fromString link) $ do
|
2020-06-13 16:22:47 +00:00
|
|
|
H.div $ H.img ! A.src (fromString $ link </> "logo.svg")
|
|
|
|
H.div do
|
2020-07-12 02:18:11 +00:00
|
|
|
H.h2 $ fromString title
|
|
|
|
H.p $ fromString subtitle
|
2020-06-13 16:22:47 +00:00
|
|
|
-- H.ul $ forM_ (Map.toList $ Types.labels project) \(k, v) ->
|
|
|
|
-- H.li $ (fromString k <> ": " <> fromString v)
|
|
|
|
|
|
|
|
logo :: Html
|
|
|
|
logo = preEscapedString "<svg xmlns=\"http://www.w3.org/2000/svg\" version=\"1.1\" height=\"19px\" width=\"29px\"><path d=\"M 2,2 A 5,5 0 0 1 7,7 L 7, 12 A 5, 5 0 0 1 2,17 M 7,7 A 5,5 0 0 1 12,2 L 22,2 A 5,5 0 0 1 27,7 L 27,12 A 5, 5 0 0 1 22,17 L 12,17\" style=\"stroke-width: 2; stroke-linecap: butt; stroke-linejoin: bevel; stroke: #fff\" fill=\"none\"/></svg>"
|
|
|
|
|
|
|
|
outer :: Html -> Html
|
2020-07-12 02:18:11 +00:00
|
|
|
outer = outerWith def
|
|
|
|
|
|
|
|
outerWith :: SiteConfig -> Html -> Html
|
|
|
|
outerWith SiteConfig{title,..} content = H.docTypeHtml do
|
2020-06-13 16:22:47 +00:00
|
|
|
H.head do
|
|
|
|
H.meta ! A.name "viewport"
|
|
|
|
! A.content "width=device-width, initial-scale=1.0, user-scalable=yes"
|
|
|
|
H.meta ! A.name "theme-color" ! A.content "#000000"
|
|
|
|
H.meta ! A.name "robots" ! A.content "index, follow"
|
|
|
|
H.meta ! charset "utf-8"
|
|
|
|
H.link ! A.rel "stylesheet" ! A.href "/assets/theme.css"
|
2020-07-12 02:18:11 +00:00
|
|
|
|
|
|
|
-- OpenGraph
|
|
|
|
H.meta ! property "og:title"
|
2020-09-25 23:45:58 +00:00
|
|
|
! A.content (textValue title)
|
2020-07-12 02:18:11 +00:00
|
|
|
|
|
|
|
H.meta ! property "og:type"
|
2020-09-25 23:45:58 +00:00
|
|
|
! A.content "website"
|
2020-07-12 02:18:11 +00:00
|
|
|
|
|
|
|
H.meta ! property "og:image"
|
2020-09-25 23:45:58 +00:00
|
|
|
! A.content (textValue image)
|
2020-07-12 02:18:11 +00:00
|
|
|
|
|
|
|
H.meta ! property "og:description"
|
2020-09-25 23:45:58 +00:00
|
|
|
! A.content (textValue description)
|
2020-07-12 02:18:11 +00:00
|
|
|
|
2020-09-25 23:45:58 +00:00
|
|
|
H.title $ toHtml title
|
2020-06-13 16:22:47 +00:00
|
|
|
|
|
|
|
H.body do
|
|
|
|
H.header ! A.id "hd" $ H.section do
|
|
|
|
H.a ! A.href "/" $ logo
|
|
|
|
H.section $ H.nav do
|
|
|
|
H.a ! A.href "/projects.html" $ "Projects"
|
|
|
|
H.a ! A.href "/visual.html" $ "Visual"
|
2020-09-25 23:45:58 +00:00
|
|
|
H.a ! A.href "/readings.html" $ "Readings"
|
2020-06-13 16:22:47 +00:00
|
|
|
H.a ! A.href "/quid.html" $ "Quid"
|
|
|
|
|
|
|
|
H.main content
|
|
|
|
|
|
|
|
H.footer ! A.id "ft" $ do
|
|
|
|
"flupe 2020 · "
|
|
|
|
H.a ! A.href "https://creativecommons.org/licenses/by-nc/2.0/" $ "CC BY-NC 2.0"
|
|
|
|
" · "
|
|
|
|
H.a ! A.href "https://instagram.com/ba.bou.m/" $ "instagram"
|
2020-07-12 02:18:11 +00:00
|
|
|
|