Compare commits

..

No commits in common. "master" and "v1.4.9" have entirely different histories.

34 changed files with 114 additions and 277 deletions

1
.gitignore vendored
View file

@ -1,7 +1,6 @@
dist* dist*
static/tmp/ static/tmp/
static/combined/ static/combined/
static/uploads/
config/client_session_key.aes config/client_session_key.aes
*.hi *.hi
*.o *.o

View file

@ -4,7 +4,7 @@ User
fullName Text maxlen=500 fullName Text maxlen=500
email Text maxlen=190 email Text maxlen=190
avatar Text maxlen=190 avatar Text maxlen=190
note Markdown sqltype=mediumtext note Text sqltype=mediumtext
UniqueUser username UniqueUser username
UniqueEmail email UniqueEmail email
deriving Typeable deriving Typeable
@ -28,8 +28,7 @@ Profile
Entry Entry
kind EntryKind maxlen=255 kind EntryKind maxlen=255
name Text Maybe maxlen=255 name Text Maybe maxlen=255
content Markdown sqltype=longtext content Text sqltype=longtext
photo Text Maybe maxlen=190
published UTCTime published UTCTime
updated UTCTime updated UTCTime
authorId UserId authorId UserId
@ -38,8 +37,3 @@ Syndication
entryId EntryId entryId EntryId
profileId ProfileId profileId ProfileId
url Text sqltype=varchar(255) url Text sqltype=varchar(255)
EntryCategory
entryId EntryId
category Category sqltype=varchar(190)
UniqueEntryCategory entryId category

View file

@ -8,8 +8,6 @@
/ HomeR GET / HomeR GET
/avatars/#UserId AvatarR GET /avatars/#UserId AvatarR GET
/categories/#Category CategoryR GET
/feed FeedR GET /feed FeedR GET
!/#EntryKind/feed FeedKindR GET !/#EntryKind/feed FeedKindR GET

View file

@ -35,4 +35,4 @@ title: 00dani.me
app-name: lebd app-name: lebd
username: dani username: dani
repository: https://gitlab.com/00dani/lebd repository: https://gitlab.com/00dani/lebd
fb-app-id: "_env:FB_APP_ID:142105433189339" #analytics: UA-YOURCODE

2
package-lock.json generated
View file

@ -1,6 +1,6 @@
{ {
"name": "lebd", "name": "lebd",
"version": "1.6.4", "version": "1.4.9",
"lockfileVersion": 1, "lockfileVersion": 1,
"requires": true, "requires": true,
"dependencies": { "dependencies": {

View file

@ -1,6 +1,6 @@
{ {
"name": "lebd", "name": "lebd",
"version": "1.6.4", "version": "1.4.9",
"description": "the codebase backing 00dani.me, an indieweb.org site", "description": "the codebase backing 00dani.me, an indieweb.org site",
"repository": { "repository": {
"type": "git", "type": "git",

View file

@ -1,5 +1,5 @@
name: lebd name: lebd
version: "1.6.4" version: "1.4.9"
dependencies: dependencies:
@ -48,11 +48,10 @@ dependencies:
- wai - wai
- blaze-markup >=0.8 && <0.9 - blaze-markup >=0.8 && <0.9
- conduit-combinators >=1.1 && <1.2 - conduit-combinators >= 1.1 && <1.2
- esqueleto >=2.5 && <2.6 - esqueleto >=2.5 && <2.6
- friendly-time >=0.4 && <0.5 - friendly-time >=0.4 && <0.5
- foreign-store >=0.2 && <0.3 - foreign-store >=0.2 && <0.3
- markdown >=0.1 && <0.2
- mustache >=2.2 && <2.3 - mustache >=2.2 && <2.3
- parsec >=3.1 && <3.2 - parsec >=3.1 && <3.2
- slug >=0.1 && <0.2 - slug >=0.1 && <0.2

View file

@ -50,7 +50,6 @@ import System.Log.FastLogger (defaultBufSize, newStdoutLoggerSet,
-- Don't forget to add new modules to your cabal file! -- Don't forget to add new modules to your cabal file!
import Handler.Avatars import Handler.Avatars
import Handler.Common import Handler.Common
import Handler.Categories
import Handler.Entries import Handler.Entries
import Handler.Feed import Handler.Feed
import Handler.Home import Handler.Home

View file

@ -22,12 +22,10 @@ import qualified Yesod.Core.Unsafe as Unsafe
import Package import Package
import Model.Cache ( getCached ) import Model.Cache ( getCached )
import Model.Category ( Category )
import Model.Entry ( entryTitle ) import Model.Entry ( entryTitle )
import Model.Entry.Kind ( EntryKind, allEntryKinds, pluralise ) import Model.Entry.Kind ( EntryKind, allEntryKinds, pluralise )
import SchemaOrg.BreadcrumbList ( breadcrumbList )
import Data.Aeson ( encode ) import Data.Aeson ( encode, object )
import qualified Text.Blaze.Internal as B import qualified Text.Blaze.Internal as B
import qualified Data.Text as T import qualified Data.Text as T
import qualified Data.Text.Lazy.Encoding as E import qualified Data.Text.Lazy.Encoding as E
@ -67,9 +65,6 @@ mkYesodData "App" $(parseRoutesFile "config/routes")
-- | A convenient synonym for creating forms. -- | A convenient synonym for creating forms.
type Form x = Html -> MForm (HandlerT App IO) (FormResult x, Widget) type Form x = Html -> MForm (HandlerT App IO) (FormResult x, Widget)
sessionLifetime :: Int
sessionLifetime = 120 -- minutes
-- Please see the documentation for the Yesod typeclass. There are a number -- Please see the documentation for the Yesod typeclass. There are a number
-- of settings which can be configured by overriding methods here. -- of settings which can be configured by overriding methods here.
instance Yesod App where instance Yesod App where
@ -80,7 +75,7 @@ instance Yesod App where
-- Store session data on the client in encrypted cookies, -- Store session data on the client in encrypted cookies,
-- default session idle timeout is 120 minutes -- default session idle timeout is 120 minutes
makeSessionBackend _ = sslOnlySessions . strictSameSiteSessions $ Just <$> defaultClientSessionBackend makeSessionBackend _ = sslOnlySessions . strictSameSiteSessions $ Just <$> defaultClientSessionBackend
sessionLifetime 120 -- timeout in minutes
"config/client_session_key.aes" "config/client_session_key.aes"
-- Redirect static requests to a subdomain - this is recommended for best -- Redirect static requests to a subdomain - this is recommended for best
@ -100,7 +95,7 @@ instance Yesod App where
-- b) Validates that incoming write requests include that token in either a header or POST parameter. -- b) Validates that incoming write requests include that token in either a header or POST parameter.
-- To add it, chain it together with the defaultMiddleware: yesodMiddleware = defaultYesodMiddleware . defaultCsrfMiddleware -- To add it, chain it together with the defaultMiddleware: yesodMiddleware = defaultYesodMiddleware . defaultCsrfMiddleware
-- For details, see the CSRF documentation in the Yesod.Core.Handler module of the yesod-core package. -- For details, see the CSRF documentation in the Yesod.Core.Handler module of the yesod-core package.
yesodMiddleware = defaultYesodMiddleware . defaultCsrfMiddleware . sslOnlyMiddleware sessionLifetime yesodMiddleware = defaultYesodMiddleware . defaultCsrfMiddleware
defaultLayout widget = do defaultLayout widget = do
master <- getYesod master <- getYesod
@ -112,7 +107,7 @@ instance Yesod App where
-- Get the breadcrumbs, as defined in the YesodBreadcrumbs instance. -- Get the breadcrumbs, as defined in the YesodBreadcrumbs instance.
(title, crumbs) <- breadcrumbs (title, crumbs) <- breadcrumbs
let allCrumbs = maybe crumbs (\route -> crumbs ++ [(route, title)]) mcurrentRoute let allCrumbs = maybe crumbs (\route -> crumbs ++ [(route, title)]) mcurrentRoute
jsonCrumbs <- fmap (E.decodeUtf8 . encode) . withUrlRenderer $ breadcrumbList allCrumbs jsonCrumbs <- fmap (E.decodeUtf8 . encode) . withUrlRenderer $ jsonLdBreadcrumbList allCrumbs
let navbars = [leftMenuItems, rightMenuItems] <*> [muser] let navbars = [leftMenuItems, rightMenuItems] <*> [muser]
@ -123,9 +118,7 @@ instance Yesod App where
-- you to use normal widget features in default-layout. -- you to use normal widget features in default-layout.
pc <- widgetToPageContent $(widgetFile "default-layout") pc <- widgetToPageContent $(widgetFile "default-layout")
let globalTitle = toHtml . siteTitle . appSettings $ master let hasPageTitle = not . B.null . pageTitle $ pc
hasPageTitle = not . B.null $ pageTitle pc
fullTitle = if hasPageTitle then mconcat [pageTitle pc, " ~ ", globalTitle] else globalTitle
withUrlRenderer $(hamletFile "templates/default-layout-wrapper.hamlet") withUrlRenderer $(hamletFile "templates/default-layout-wrapper.hamlet")
-- The page to be redirected to when authentication is required. -- The page to be redirected to when authentication is required.
@ -191,6 +184,22 @@ instance YesodBreadcrumbs App where
breadcrumb (EntryWithSlugR kind entryId _) = breadcrumb $ EntryR kind entryId breadcrumb (EntryWithSlugR kind entryId _) = breadcrumb $ EntryR kind entryId
breadcrumb _ = return ("home", Nothing) breadcrumb _ = return ("home", Nothing)
jsonLdBreadcrumbList :: [(Route App, Text)] -> (Route App -> [(Text, Text)] -> Text) -> Value
jsonLdBreadcrumbList crumbs url = object
[ ("@context", "http://schema.org")
, ("@type", "BreadcrumbList")
, "itemListElement" .= zipWith (jsonLdListItem url) [1 :: Int ..] crumbs
]
jsonLdListItem :: (Route App -> [(Text, Text)] -> Text) -> Int -> (Route App, Text) -> Value
jsonLdListItem url i (r, t) = object
[ ("@type", "ListItem")
, "position" .= i
, "item" .= object
[ "@id" .= url r []
, "name" .= t
]
]
-- How to run database actions. -- How to run database actions.
instance YesodPersist App where instance YesodPersist App where
type YesodPersistBackend App = SqlBackend type YesodPersistBackend App = SqlBackend
@ -253,7 +262,3 @@ unsafeHandler = Unsafe.fakeHandlerGetLogger appLogger
-- https://github.com/yesodweb/yesod/wiki/Sending-email -- https://github.com/yesodweb/yesod/wiki/Sending-email
-- https://github.com/yesodweb/yesod/wiki/Serve-static-files-from-a-separate-domain -- https://github.com/yesodweb/yesod/wiki/Serve-static-files-from-a-separate-domain
-- https://github.com/yesodweb/yesod/wiki/i18n-messages-in-the-scaffolding -- https://github.com/yesodweb/yesod/wiki/i18n-messages-in-the-scaffolding
userProfile :: User -> Route App
userProfile user
| userUsername user == siteUsername compileTimeAppSettings = HomeR
| otherwise = error "Multiple profile pages are not yet supported"

View file

@ -1,22 +0,0 @@
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
module Handler.Categories where
import Import hiding ( on, (==.) )
import Database.Esqueleto
import Widget.Feed ( hFeed )
import Model.Category ( Category, asTag )
import qualified Data.Text as T
getCategoryR :: Category -> Handler Html
getCategoryR tag = do
title <- asks $ siteTitle . appSettings
entries <- runDB . select . from $ \(entry `InnerJoin` category) -> do
on $ entry ^. EntryId ==. category ^. EntryCategoryEntryId
where_ $ category ^. EntryCategoryCategory ==. val tag
return entry
defaultLayout $ do
setTitle . toHtml . asTag $ tag
T.concat [asTag tag, " ~ ", title] `hFeed` entries

View file

@ -7,13 +7,11 @@
module Handler.Common where module Handler.Common where
import Data.FileEmbed (embedFile) import Data.FileEmbed (embedFile)
import Database.Esqueleto ( (^.) )
import qualified Database.Esqueleto as E
import Yesod.Sitemap import Yesod.Sitemap
import Import import Import
import Model.Entry.Kind ( allEntryKinds ) import Model.Entry.Kind ( EntryKind, allEntryKinds )
import Widget.Entry ( entryR ) import Widget.Entry ( entryR )
-- These handlers embed files in the executable at compile time to avoid a -- These handlers embed files in the executable at compile time to avoid a
@ -33,9 +31,6 @@ getRobotsR = robots SitemapR
getSitemapR :: Handler TypedContent getSitemapR :: Handler TypedContent
getSitemapR = do getSitemapR = do
categories <- runDB . E.select . E.distinct . E.from $ \ec -> do
E.orderBy [E.asc $ ec ^. EntryCategoryCategory]
return $ ec ^. EntryCategoryCategory
entries <- runDB $ selectList [] [Desc EntryPublished] entries <- runDB $ selectList [] [Desc EntryPublished]
sitemap $ do sitemap $ do
yield SitemapUrl yield SitemapUrl
@ -44,19 +39,20 @@ getSitemapR = do
, sitemapChangeFreq = Just Daily , sitemapChangeFreq = Just Daily
, sitemapPriority = Nothing , sitemapPriority = Nothing
} }
yieldMany $ sitemapUrl . CategoryR . E.unValue <$> categories yieldMany $ kindToSitemapUrl <$> allEntryKinds
yieldMany $ sitemapUrl . EntriesR <$> allEntryKinds
yieldMany $ entryToSitemapUrl <$> entries yieldMany $ entryToSitemapUrl <$> entries
sitemapUrl :: a -> SitemapUrl a kindToSitemapUrl :: EntryKind -> SitemapUrl (Route App)
sitemapUrl loc = SitemapUrl kindToSitemapUrl kind = SitemapUrl
{ sitemapLoc = loc { sitemapLoc = EntriesR kind
, sitemapLastMod = Nothing , sitemapLastMod = Nothing
, sitemapChangeFreq = Nothing , sitemapChangeFreq = Nothing
, sitemapPriority = Nothing , sitemapPriority = Nothing
} }
entryToSitemapUrl :: Entity Entry -> SitemapUrl (Route App) entryToSitemapUrl :: Entity Entry -> SitemapUrl (Route App)
entryToSitemapUrl entry = (sitemapUrl $ entryR entry) entryToSitemapUrl entry = SitemapUrl
{ sitemapLastMod = Just . entryUpdated . entityVal $ entry { sitemapLoc = entryR entry
, sitemapLastMod = Just . entryUpdated . entityVal $ entry
, sitemapChangeFreq = Nothing
, sitemapPriority = Nothing
} }

View file

@ -1,6 +1,6 @@
{-# LANGUAGE NoImplicitPrelude #-} {-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TemplateHaskell #-}
module Handler.Entries where module Handler.Entries where
import Import import Import
@ -9,7 +9,6 @@ import Yesod.AtomFeed ( atomLink )
import Model.Cache ( getCached ) import Model.Cache ( getCached )
import Model.Entry ( entryTitle ) import Model.Entry ( entryTitle )
import Model.Markdown ( unMarkdown )
import Widget.Entry ( entryR, hEntry ) import Widget.Entry ( entryR, hEntry )
import Widget.Feed ( hFeed ) import Widget.Feed ( hFeed )
@ -20,11 +19,10 @@ getEntriesR :: K.EntryKind -> Handler Html
getEntriesR kind = do getEntriesR kind = do
entries <- runDB $ selectList [EntryKind ==. kind] [Desc EntryPublished] entries <- runDB $ selectList [EntryKind ==. kind] [Desc EntryPublished]
title <- asks $ siteTitle . appSettings title <- asks $ siteTitle . appSettings
let myTitle = T.concat [K.pluralise kind, " ~ ", title]
defaultLayout $ do defaultLayout $ do
setTitle . toHtml . K.pluralise $ kind setTitle . toHtml . K.pluralise $ kind
FeedKindR kind `atomLink` myTitle atomLink (FeedKindR kind) $ T.concat [K.pluralise kind, " ~ ", title]
hFeed myTitle entries $(widgetFile "entries")
getEntryR :: a -> EntryId -> Handler Html getEntryR :: a -> EntryId -> Handler Html
getEntryR _ = renderEntry <=< getCached getEntryR _ = renderEntry <=< getCached
@ -36,19 +34,8 @@ renderEntry :: (Entity Entry) -> Handler Html
renderEntry entry = do renderEntry entry = do
let correctRoute = entryR entry let correctRoute = entryR entry
actualRoute <- getCurrentRoute actualRoute <- getCurrentRoute
author <- getCached . entryAuthorId $ entityVal entry
when (actualRoute /= Just correctRoute) $ when (actualRoute /= Just correctRoute) $
redirectWith movedPermanently301 correctRoute redirectWith movedPermanently301 correctRoute
defaultLayout $ do defaultLayout $ do
setTitle . toHtml . entryTitle . entityVal $ entry setTitle . toHtml . entryTitle . entityVal $ entry
toWidgetHead [hamlet| $(widgetFile "entry")
<meta name="author" content=#{userFullName $ entityVal author}>
<link rel="author" href=@{userProfile $ entityVal author}>
<meta name="description" content=#{unMarkdown $ entryContent $ entityVal entry}>
<meta property="og:title" content=#{entryTitle $ entityVal entry}>
<meta property="og:type" content="article">
<meta property="og:description" content=#{unMarkdown $ entryContent $ entityVal entry}>
<meta property="article:author" content=@{userProfile $ entityVal author}>
<meta property="article:section" content=#{K.pluralise $ entryKind $ entityVal entry}>
|]
hEntry entry

View file

@ -15,9 +15,14 @@ import Widget.Feed ( hFeed )
getHomeR :: Handler Html getHomeR :: Handler Html
getHomeR = do getHomeR = do
settings <- asks appSettings settings <- asks appSettings
user <- runDB . getBy404 . UniqueUser . siteUsername $ settings userE@(Entity userId user) <- runDB . getBy404 . UniqueUser . siteUsername $ settings
let title = siteTitle settings let title = siteTitle settings
entries <- runDB $ selectList [EntryAuthorId ==. entityKey user] [Desc EntryPublished] entries <- runDB $ selectList [EntryAuthorId ==. userId] [Desc EntryPublished]
defaultLayout $ do defaultLayout $ do
atomLink FeedR title atomLink FeedR title
toWidgetHead
[hamlet|
<meta name="author" content=#{userFullName user}>
<link rel="author" href=@{HomeR}>
|]
$(widgetFile "home") $(widgetFile "home")

View file

@ -15,9 +15,7 @@ import Yesod.Auth.HashDB ( HashDBUser(..) )
import Text.Mustache ( (~>) ) import Text.Mustache ( (~>) )
import qualified Text.Mustache as M import qualified Text.Mustache as M
import Model.Category ( Category )
import Model.Entry.Kind ( EntryKind ) import Model.Entry.Kind ( EntryKind )
import Model.Markdown ( Markdown )
-- You can define all of your database entities in the entities file. -- You can define all of your database entities in the entities file.
-- You can find more information on persistent and how to declare entities -- You can find more information on persistent and how to declare entities

View file

@ -1,14 +0,0 @@
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
module Model.Category where
import Database.Persist ( PersistField )
import Web.Slug ( Slug, unSlug )
import Yesod ( PathPiece )
import qualified Data.Text as T
newtype Category = Category { unCategory :: Slug }
deriving (Eq, Read, Show, PathPiece, PersistField)
asTag :: Category -> T.Text
asTag = T.cons '#' . unSlug . unCategory

View file

@ -2,29 +2,14 @@
module Model.Entry where module Model.Entry where
import Model ( Entry, entryName, entryContent ) import Model ( Entry, entryName, entryContent )
import Model.Markdown ( Markdown(Markdown), unMarkdown )
import Data.Maybe ( fromMaybe ) import Data.Maybe ( fromMaybe )
import qualified Data.Text as T import qualified Data.Text as T
import qualified Data.Text.Lazy as TL
entryTitle :: Entry -> T.Text entryTitle :: Entry -> T.Text
entryTitle = fromMaybe <$> TL.toStrict . unMarkdown . shorten 30 . entryContent <*> entryName entryTitle = fromMaybe <$> shorten 30 . entryContent <*> entryName
class Shorten a where shorten :: Int -> T.Text -> T.Text
shorten :: Int -> a -> a shorten n t
| T.length t > n = flip T.append "..." . T.take (n - 1) $ t
instance Shorten T.Text where | otherwise = t
shorten i t
| T.compareLength t n == GT = flip T.append "..." . T.take (n - 1) $ t
| otherwise = t
where n = fromIntegral i
instance Shorten TL.Text where
shorten i t
| TL.compareLength t n == GT = flip TL.append "..." . TL.take (n - 1) $ t
| otherwise = t
where n = fromIntegral i
instance Shorten Markdown where
shorten n (Markdown t) = Markdown $ shorten n t

View file

@ -1,38 +0,0 @@
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE OverloadedStrings #-}
module Model.Markdown ( Markdown(..) ) where
import Data.Aeson ( FromJSON(..), ToJSON(..), Value(Object), object, (.=), (.:) )
import Data.Default ( def )
import Database.Persist ( PersistField(..), PersistValue(PersistText) )
import Database.Persist.Sql ( PersistFieldSql(..), SqlType(SqlString) )
import Data.String ( IsString )
import Text.Blaze ( ToMarkup(..) )
import Text.Markdown ( markdown )
import qualified Data.Text as T
import qualified Data.Text.Lazy as TL
newtype Markdown = Markdown { unMarkdown :: TL.Text }
deriving (Eq, Ord, Monoid, IsString, Show)
instance ToMarkup Markdown where
toMarkup (Markdown t) = markdown def t
instance PersistField Markdown where
toPersistValue (Markdown t) = PersistText $ TL.toStrict t
fromPersistValue (PersistText t) = Right . Markdown $ TL.fromStrict t
fromPersistValue wrongValue = Left $ T.concat
[ "Model.Markdown: When attempting to create Markdown from a PersistValue, received "
, T.pack $ show wrongValue
, " when a value of type PersistText was expected."
]
instance PersistFieldSql Markdown where
sqlType _ = SqlString
instance ToJSON Markdown where
toJSON (Markdown text) = object ["markdown" .= text]
instance FromJSON Markdown where
parseJSON (Object v) = Markdown <$> v .: "markdown"
parseJSON _ = mempty

View file

@ -1,21 +0,0 @@
{-# LANGUAGE OverloadedStrings #-}
module SchemaOrg.BreadcrumbList ( breadcrumbList ) where
import Data.Aeson
import qualified Data.Text as T
breadcrumbList :: [(a, T.Text)] -> (a -> [(T.Text, T.Text)] -> T.Text) -> Value
breadcrumbList crumbs url = object
[ ("@context", "http://schema.org")
, ("@type", "BreadcrumbList")
, "itemListElement" .= zipWith (listItem url) [1 :: Int ..] crumbs
]
listItem :: (a -> [(T.Text, T.Text)] -> T.Text) -> Int -> (a, T.Text) -> Value
listItem url i (r, t) = object
[ ("@type", "ListItem")
, "position" .= i
, "item" .= object
[ "@id" .= url r []
, "name" .= t
]
]

View file

@ -19,8 +19,9 @@ import Data.Yaml (decodeEither')
import Database.Persist.MySQL (MySQLConf (..)) import Database.Persist.MySQL (MySQLConf (..))
import Language.Haskell.TH.Syntax (Exp, Name, Q) import Language.Haskell.TH.Syntax (Exp, Name, Q)
import Network.Wai.Handler.Warp (HostPreference) import Network.Wai.Handler.Warp (HostPreference)
import Text.Hamlet (HamletSettings(hamletNewlines), NewlineStyle(AlwaysNewlines), defaultHamletSettings)
import Yesod.Default.Config2 (applyEnvValue, configSettingsYml) import Yesod.Default.Config2 (applyEnvValue, configSettingsYml)
import Yesod.Default.Util (WidgetFileSettings, widgetFileNoReload, import Yesod.Default.Util (WidgetFileSettings(wfsHamletSettings), widgetFileNoReload,
widgetFileReload) widgetFileReload)
import qualified Database.MySQL.Base as MySQL import qualified Database.MySQL.Base as MySQL
@ -58,9 +59,9 @@ data AppSettings = AppSettings
, appSkipCombining :: Bool , appSkipCombining :: Bool
-- ^ Perform no stylesheet/script combining -- ^ Perform no stylesheet/script combining
, appFacebookId :: Maybe Int -- Example app-specific configuration values.
-- ^ Facebook app ID. , appAnalytics :: Maybe Text
-- ^ Google Analytics code
, siteTitle :: Text , siteTitle :: Text
-- ^ Site-wide title. -- ^ Site-wide title.
, siteUsername :: Text , siteUsername :: Text
@ -94,7 +95,7 @@ instance FromJSON AppSettings where
appMutableStatic <- o .:? "mutable-static" .!= defaultDev appMutableStatic <- o .:? "mutable-static" .!= defaultDev
appSkipCombining <- o .:? "skip-combining" .!= defaultDev appSkipCombining <- o .:? "skip-combining" .!= defaultDev
appFacebookId <- o .:? "fb-app-id" appAnalytics <- o .:? "analytics"
siteTitle <- o .: "title" siteTitle <- o .: "title"
siteUsername <- o .: "username" siteUsername <- o .: "username"
@ -119,7 +120,7 @@ instance FromJSON AppSettings where
-- --
-- https://github.com/yesodweb/yesod/wiki/Overriding-widgetFile -- https://github.com/yesodweb/yesod/wiki/Overriding-widgetFile
widgetFileSettings :: WidgetFileSettings widgetFileSettings :: WidgetFileSettings
widgetFileSettings = def widgetFileSettings = def { wfsHamletSettings = defaultHamletSettings { hamletNewlines = AlwaysNewlines } }
-- | How static files should be combined. -- | How static files should be combined.
combineSettings :: CombineSettings combineSettings :: CombineSettings

View file

@ -1,6 +1,5 @@
{-# LANGUAGE NoImplicitPrelude #-} {-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-} {-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE QuasiQuotes #-}
{-# LANGUAGE TemplateHaskell #-} {-# LANGUAGE TemplateHaskell #-}
module Widget.Card ( hCard ) where module Widget.Card ( hCard ) where
@ -9,7 +8,6 @@ import Import
import Database.Esqueleto ( (^.) ) import Database.Esqueleto ( (^.) )
import qualified Database.Esqueleto as E import qualified Database.Esqueleto as E
import Model.Markdown ( unMarkdown )
import Text.Mustache ( substitute ) import Text.Mustache ( substitute )
import Util ( compileMustache ) import Util ( compileMustache )
@ -26,7 +24,6 @@ profileUrl site = substitute $ T.unpack (siteName site) `compileMustache` siteTe
hCard :: Entity User -> Widget hCard :: Entity User -> Widget
hCard (Entity userId user) = do hCard (Entity userId user) = do
let (firstName:lastName) = T.words $ userFullName user
mcurrentRoute <- getCurrentRoute mcurrentRoute <- getCurrentRoute
userProfiles <- handlerToWidget . runDB . E.select . E.from $ \(profile `E.InnerJoin` site) -> do userProfiles <- handlerToWidget . runDB . E.select . E.from $ \(profile `E.InnerJoin` site) -> do
E.on $ profile ^. ProfileSiteId E.==. site ^. SiteId E.on $ profile ^. ProfileSiteId E.==. site ^. SiteId
@ -34,23 +31,4 @@ hCard (Entity userId user) = do
E.orderBy [E.asc $ site ^. SiteName] E.orderBy [E.asc $ site ^. SiteName]
return (site, profile) return (site, profile)
pgpKeys <- handlerToWidget . runDB $ map entityVal <$> selectList [PgpKeyUserId ==. userId] [] pgpKeys <- handlerToWidget . runDB $ map entityVal <$> selectList [PgpKeyUserId ==. userId] []
let maybeFb = find (\(Entity _ site, _) -> "Facebook" == siteName site) userProfiles
toWidgetHead [hamlet|
<meta name="author" content=#{userFullName user}>
<meta name="description" content=#{unMarkdown $ userNote user}>
<link rel="author" href=@{HomeR}>
<meta property="og:type" content="profile">
<meta property="og:title" content="#{userFullName user}">
<meta property="og:description" content=#{unMarkdown $ userNote user}>
<meta property="og:image" content=@{staticR ["img", userAvatar user]}>
<meta property="profile:first_name" content=#{firstName}>
<meta property="profile:last_name" content=#{T.unwords lastName}>
<meta property="profile:username" content=#{userUsername user}>
$maybe (_, Entity _ fb) <- maybeFb
<meta property="fb:profile_id" content=#{profileUsername fb}>
$forall key <- pgpKeys
<link rel="pgpkey" type="application/pgp-keys" href=@{routeFromPgp key}>
|]
$(widgetFile "mf2/h-card") $(widgetFile "mf2/h-card")

View file

@ -10,7 +10,6 @@ import Database.Esqueleto ( (^.) )
import qualified Database.Esqueleto as E import qualified Database.Esqueleto as E
import Data.Time.Format ( defaultTimeLocale, formatTime, iso8601DateFormat ) import Data.Time.Format ( defaultTimeLocale, formatTime, iso8601DateFormat )
import Data.Time.Format.Human ( humanReadableTime ) import Data.Time.Format.Human ( humanReadableTime )
import Model.Entry ( entryTitle )
import Web.Slug ( mkSlug ) import Web.Slug ( mkSlug )
data FormattedTime = FormattedTime data FormattedTime = FormattedTime

View file

@ -4,9 +4,5 @@ module Widget.Feed ( hFeed ) where
import Import import Import
import Widget.Entry ( hEntry ) import Widget.Entry ( hEntry )
import qualified Data.Text as T hFeed :: [Entity Entry] -> Widget
hFeed entries = $(widgetFile "mf2/h-feed")
hFeed :: T.Text -> [Entity Entry] -> Widget
hFeed name entries = do
mroute <- getCurrentRoute
$(widgetFile "mf2/h-feed")

View file

@ -5,12 +5,12 @@ $doctype 5
<meta name="viewport" content="width=device-width, initial-scale=1, shrink-to-fit=no"> <meta name="viewport" content="width=device-width, initial-scale=1, shrink-to-fit=no">
<meta name="generator" content="#{packageName package} #{packageVersion package}"> <meta name="generator" content="#{packageName package} #{packageVersion package}">
<title>#{fullTitle} <title>
$if hasPageTitle
#{pageTitle pc} ~ #
#{siteTitle $ appSettings master}
$maybe route <- mcurrentRoute $maybe route <- mcurrentRoute
<link rel="canonical" href=@{route}> <link rel="canonical" href=@{route}>
<meta property="og:url" content=@{route}>
$maybe fb <- appFacebookId $ appSettings master
<meta property="fb:app_id" content=#{fb}>
<link rel="sitemap" href=@{SitemapR}> <link rel="sitemap" href=@{SitemapR}>
<link rel="stylesheet" href="https://maxcdn.bootstrapcdn.com/bootstrap/4.0.0-beta/css/bootstrap.min.css" integrity="sha384-/Y6pD6FV/Vv2HJnA6t+vslU6fwYXjCFtcEpHbNJ0lyAFsXTsjBbfaDjzALeQsN6M" crossorigin="anonymous"> <link rel="stylesheet" href="https://maxcdn.bootstrapcdn.com/bootstrap/4.0.0-beta/css/bootstrap.min.css" integrity="sha384-/Y6pD6FV/Vv2HJnA6t+vslU6fwYXjCFtcEpHbNJ0lyAFsXTsjBbfaDjzALeQsN6M" crossorigin="anonymous">
@ -25,3 +25,14 @@ $doctype 5
<script src="https://code.jquery.com/jquery-3.2.1.slim.min.js" integrity="sha384-KJ3o2DKtIkvYIK3UENzmM7KCkRr/rE9/Qpg6aAZGJwFDMVNA/GpGFF93hXpG5KkN" crossorigin="anonymous"> <script src="https://code.jquery.com/jquery-3.2.1.slim.min.js" integrity="sha384-KJ3o2DKtIkvYIK3UENzmM7KCkRr/rE9/Qpg6aAZGJwFDMVNA/GpGFF93hXpG5KkN" crossorigin="anonymous">
<script src="https://cdnjs.cloudflare.com/ajax/libs/popper.js/1.11.0/umd/popper.min.js" integrity="sha384-b/U6ypiBEHpOf/4+1nzFpr53nxSS+GLCkfwBdFNTxtclqqenISfwAzpKaMNFNmj4" crossorigin="anonymous"> <script src="https://cdnjs.cloudflare.com/ajax/libs/popper.js/1.11.0/umd/popper.min.js" integrity="sha384-b/U6ypiBEHpOf/4+1nzFpr53nxSS+GLCkfwBdFNTxtclqqenISfwAzpKaMNFNmj4" crossorigin="anonymous">
<script src="https://maxcdn.bootstrapcdn.com/bootstrap/4.0.0-beta/js/bootstrap.min.js" integrity="sha384-h0AbiXch4ZDo7tp9hKZ4TsHbi047NrKGLO3SEJAg45jXxnGIfYzk4Si90RDIqNm1" crossorigin="anonymous"> <script src="https://maxcdn.bootstrapcdn.com/bootstrap/4.0.0-beta/js/bootstrap.min.js" integrity="sha384-h0AbiXch4ZDo7tp9hKZ4TsHbi047NrKGLO3SEJAg45jXxnGIfYzk4Si90RDIqNm1" crossorigin="anonymous">
$maybe analytics <- appAnalytics $ appSettings master
<script>
if(!window.location.href.match(/localhost/)){
(function(i,s,o,g,r,a,m){i['GoogleAnalyticsObject']=r;i[r]=i[r]||function(){
(i[r].q=i[r].q||[]).push(arguments)},i[r].l=1*new Date();a=s.createElement(o),
m=s.getElementsByTagName(o)[0];a.async=1;a.src=g;m.parentNode.insertBefore(a,m)
})(window,document,'script','https://www.google-analytics.com/analytics.js','ga');
ga('create', '#{analytics}', 'auto');
ga('send', 'pageview');
}

View file

@ -7,13 +7,6 @@ a
text-decoration: none text-decoration: none
line-height: 1 line-height: 1
code, kbd, pre, samp
font-family: Monoid, Hack, Inconsolata, Menlo, Monaco, Consolas, "Liberation Mono", monospace
code, pre
color: #cccccc
code
background-color: #141414
body body
background-color: #1d1f21 background-color: #1d1f21
color: #c9cacc color: #c9cacc

View file

@ -1,5 +1,5 @@
<header> <header>
<nav .navbar .navbar-expand-md .navbar-dark.bg-dark> <nav .navbar .navbar-expand-lg .navbar-dark.bg-dark>
<a .navbar-brand rel="home" href=@{HomeR}>#{siteTitle $ appSettings master} <a .navbar-brand rel="home" href=@{HomeR}>#{siteTitle $ appSettings master}
<button type="button" .navbar-toggler data-toggle="collapse" data-target="#navbar" aria-expanded="false" aria-controls="navbar" aria-label="Toggle navigation"> <button type="button" .navbar-toggler data-toggle="collapse" data-target="#navbar" aria-expanded="false" aria-controls="navbar" aria-label="Toggle navigation">
<span .navbar-toggler-icon> <span .navbar-toggler-icon>

1
templates/entries.hamlet Normal file
View file

@ -0,0 +1 @@
^{hFeed entries}

1
templates/entry.hamlet Normal file
View file

@ -0,0 +1 @@
^{hEntry entry}

View file

@ -2,10 +2,11 @@ body > main
display: flex display: flex
flex-direction: column flex-direction: column
align-items: center align-items: center
> div.h-feed > ol.h-feed
flex: 1 flex: 1
margin-bottom: 0 margin-bottom: 0
> aside.author > .author
height: 100%
max-width: 25rem max-width: 25rem
margin-bottom: 2em margin-bottom: 2em
> .h-card > .h-card
@ -15,8 +16,8 @@ body > main
@media (min-width: 768px) @media (min-width: 768px)
body > main body > main
flex-direction: row-reverse flex-direction: row-reverse
align-items: unset align-items: flex-start
> div.h-feed > ol.h-feed
margin-right: 2em margin-right: 2em
> aside.author > .author
margin-bottom: 0 margin-bottom: 0

View file

@ -1,2 +1,2 @@
<aside .author>^{hCard user} <div .author>^{hCard userE}
^{hFeed title entries} ^{hFeed entries}

View file

@ -1,25 +1,26 @@
<article .card.h-card .bg-dark itemscope itemtype="http://schema.org/Person"> <div .card.h-card .bg-dark>
$maybe route <- mcurrentRoute $maybe route <- mcurrentRoute
<a .u-uid.u-url itemprop="url" href=@{route} hidden> <a .u-uid.u-url href=@{route} hidden>
<img .card-img-top.u-photo itemprop="image" src=@{AvatarR userId} alt=#{userFullName user}> <img .card-img-top.u-photo src=@{AvatarR userId} alt=#{userFullName user}>
<div .card-body> <div .card-body>
<h4 .card-title.p-name itemprop="name">#{userFullName user} <h4 .card-title.p-name>#{userFullName user}
$forall key <- pgpKeys $forall key <- pgpKeys
<a .card-subtitle.u-key type="application/pgp-keys" href=@{routeFromPgp key}> <a .card-subtitle.u-key href=@{routeFromPgp key}>
<i .fa.fa-key> <i .fa.fa-key>
#{prettyPgp key} #{prettyPgp key}
<div .p-note itemprop="description" .text-muted>#{userNote user} <link rel="pgpkey" type="application/pgp-keys" href=@{routeFromPgp key}>
<p .card-text.p-note .text-muted>#{userNote user}
<ul .profiles> <ul .profiles>
<li> <li>
<a .u-email rel="me" itemprop="email" href="mailto:#{userEmail user}"> <a .u-email rel="me" href="mailto:#{userEmail user}">
<i .fa.fa-envelope> <i .fa.fa-envelope>
#{userEmail user} #{userEmail user}
$forall (Entity _ site, Entity _ profile) <- userProfiles $forall (Entity _ site, Entity _ profile) <- userProfiles
<li> <li>
<a .u-url rel="me" itemprop="sameAs" href="#{profileUrl site profile}"> <a .u-url rel="me" href="#{profileUrl site profile}">
<i .#{siteIcon site}> <i .#{siteIcon site}>
$maybe name <- profileDisplayName profile $maybe name <- profileDisplayName profile
#{name} #{name}

View file

@ -1,6 +1,4 @@
article.h-entry article.h-entry
.e-content p:last-child
margin-bottom: 0
> .card-footer > .card-footer
display: flex display: flex
flex-wrap: wrap flex-wrap: wrap

View file

@ -1,33 +1,24 @@
<article .h-entry .card.bg-dark itemscope itemtype="http://schema.org/BlogPosting"> <article .h-entry .card.bg-dark>
$maybe photo <- entryPhoto entry
<img .card-img-top.u-photo itemprop="image" src=@{staticR ["uploads", photo]} alt=#{entryTitle entry}>
<div .card-body> <div .card-body>
$maybe name <- entryName entry $maybe name <- entryName entry
<h4 .p-name .card-title itemprop="headline">#{name} <h4 .p-name .card-title>#{name}
<div .e-content itemprop="articleBody"> <div .e-content>
#{entryContent entry} #{entryContent entry}
$nothing $nothing
<div itemprop="headline" hidden>#{entryTitle entry} <div .e-content.p-name>
<div .e-content.p-name itemprop="articleBody">
#{entryContent entry} #{entryContent entry}
<div .card-footer> <div .card-footer>
$maybe author <- maybeAuthor $maybe author <- maybeAuthor
<a .p-author.h-card href=@{userProfile author}> <a .p-author.h-card href=@{HomeR}>
<img .u-photo src=@{AvatarR $ entryAuthorId entry} alt=#{userFullName author}> <img .u-photo src=@{AvatarR $ entryAuthorId entry} alt=#{userFullName author}>
#{userFullName author} #{userFullName author}
$# Use a separate hidden block for the schema.org metadata because you <a .u-url href="@{entryR (Entity entryId entry)}">
$# can't put itemprop="author" and itemprop="url" on the same element,
$# because schema.org is garbage.
<div hidden itemprop="author" itemscope itemtype="http://schema.org/Person">
<a itemprop="url" href=@{userProfile author}>
<span itemprop="name">#{userFullName author}
<a .u-url itemprop="mainEntityOfPage" href=@{entryR (Entity entryId entry)}>
<i .fa.fa-link> <i .fa.fa-link>
permalink permalink
<time .dt-published itemprop="datePublished" datetime=#{timeUnfriendly published} title=#{timeUnfriendly published}> <time .dt-published datetime=#{timeUnfriendly published} title=#{timeUnfriendly published}>
<i .fa.fa-calendar> <i .fa.fa-calendar>
#{timeFriendly published} #{timeFriendly published}
<time .dt-updated itemprop="dateModified" datetime=#{timeUnfriendly updated} title=#{timeUnfriendly updated} :published == updated:hidden> <time .dt-updated datetime=#{timeUnfriendly updated} title=#{timeUnfriendly updated} :published == updated:hidden>
<i .fa.fa-pencil> <i .fa.fa-pencil>
#{timeFriendly updated} #{timeFriendly updated}
$forall (E.Value url, E.Value icon, E.Value name) <- posses $forall (E.Value url, E.Value icon, E.Value name) <- posses

View file

@ -1,5 +1,5 @@
div.h-feed ol.h-feed
> ol.list-unstyled list-style: none
margin-bottom: 0 padding-left: 0
> li:not(:last-child) > li:not(:last-child)
margin-bottom: 1em margin-bottom: 1em

View file

@ -1,7 +1,3 @@
<div .h-feed> <ol .h-feed>
<span .p-name hidden>#{name} $forall entry <- entries
$maybe route <- mroute <li>^{hEntry entry}
<a .u-url href=@{route} hidden>
<ol .list-unstyled>
$forall entry <- entries
<li>^{hEntry entry}