2012-03-07 17:31:42 +01:00
|
|
|
{-# LANGUAGE OverloadedStrings, ScopedTypeVariables, GeneralizedNewtypeDeriving,
|
|
|
|
DeriveDataTypeable, FlexibleContexts, MultiParamTypeClasses, TemplateHaskell,
|
2012-03-13 05:31:13 +01:00
|
|
|
TypeFamilies, RecordWildCards, BangPatterns #-}
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
module Main where
|
|
|
|
|
2012-03-07 12:59:44 +01:00
|
|
|
import Control.Applicative ((<$>), (<*>), optional, pure)
|
2012-03-08 11:42:10 +01:00
|
|
|
import Control.Exception (bracket)
|
|
|
|
import Control.Monad (msum, mzero, when, unless)
|
2012-03-13 19:50:13 +01:00
|
|
|
import Control.Monad.IO.Class (liftIO)
|
2012-03-07 17:31:42 +01:00
|
|
|
import Control.Monad.State (get, put)
|
|
|
|
import Control.Monad.Reader (ask)
|
2012-03-09 17:57:53 +01:00
|
|
|
import qualified Crypto.Hash.SHA512 as SHA
|
2012-03-07 17:31:42 +01:00
|
|
|
import Data.Acid
|
|
|
|
import Data.Acid.Advanced
|
|
|
|
import Data.Acid.Local
|
2012-03-09 17:57:53 +01:00
|
|
|
import qualified Data.ByteString.Base64 as B64 (encode)
|
2012-03-13 06:35:56 +01:00
|
|
|
import Data.ByteString.Char8 (ByteString, pack, unpack)
|
2012-03-07 17:31:42 +01:00
|
|
|
import Data.Data (Data, Typeable)
|
|
|
|
import Data.Monoid (mempty)
|
2012-03-06 19:39:54 +01:00
|
|
|
import Data.Text (Text)
|
|
|
|
import qualified Data.Text as T
|
2012-02-23 03:30:14 +01:00
|
|
|
import Data.Time
|
2012-03-07 17:31:42 +01:00
|
|
|
import Data.SafeCopy (base, deriveSafeCopy)
|
2012-03-13 05:31:13 +01:00
|
|
|
import Happstack.Server hiding (Session)
|
2012-03-09 17:57:53 +01:00
|
|
|
import System.Environment(getEnv)
|
2012-03-07 12:59:44 +01:00
|
|
|
import System.Locale (defaultTimeLocale)
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-02-23 03:30:14 +01:00
|
|
|
import Blog
|
2012-03-14 00:37:00 +01:00
|
|
|
import BlogDB hiding (addComment, updateEntry)
|
2012-02-24 16:06:33 +01:00
|
|
|
import Locales
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-03-09 17:57:53 +01:00
|
|
|
{- Server -}
|
|
|
|
|
|
|
|
tmpPolicy :: BodyPolicy
|
2012-03-14 00:37:00 +01:00
|
|
|
tmpPolicy = (defaultBodyPolicy "./tmp/" 0 200000 1000)
|
2012-03-09 17:57:53 +01:00
|
|
|
|
|
|
|
main :: IO()
|
|
|
|
main = do
|
|
|
|
putStrLn ("TazBlog " ++ version ++ " in Haskell starting")
|
|
|
|
tbDir <- getEnv "TAZBLOG"
|
2012-03-13 05:31:13 +01:00
|
|
|
bracket (openLocalStateFrom (tbDir ++ "/BlogState") initialBlogState)
|
2012-03-09 17:57:53 +01:00
|
|
|
(createCheckpointAndClose)
|
2012-03-13 05:31:13 +01:00
|
|
|
(\acid -> simpleHTTP nullConf $ tazBlog acid)
|
2012-03-09 17:57:53 +01:00
|
|
|
|
2012-03-13 05:31:13 +01:00
|
|
|
tazBlog :: AcidState Blog -> ServerPart Response
|
2012-03-14 00:37:00 +01:00
|
|
|
tazBlog acid =
|
2012-03-13 05:31:13 +01:00
|
|
|
msum [ dir (show DE) $ blogHandler acid DE
|
|
|
|
, dir (show EN) $ blogHandler acid EN
|
2012-02-23 03:30:14 +01:00
|
|
|
, do nullDir
|
2012-03-13 05:31:13 +01:00
|
|
|
showIndex acid DE
|
2012-02-23 03:30:14 +01:00
|
|
|
, do dir " " $ nullDir
|
2012-03-13 06:35:56 +01:00
|
|
|
seeOther ("https://plus.google.com/115916629925754851590" :: Text) (toResponse ())
|
2012-03-07 13:40:47 +01:00
|
|
|
, path $ \(year :: Int) -> path $ \(month :: Int) -> path $ \(id_ :: String) -> formatOldLink year month id_
|
2012-02-23 03:30:14 +01:00
|
|
|
, dir "res" $ serveDirectory DisableBrowsing [] "../res"
|
2012-03-06 23:34:04 +01:00
|
|
|
, dir "notice" $ ok $ toResponse showSiteNotice
|
2012-03-14 01:36:57 +01:00
|
|
|
, do dirs "admin/postentry" $ nullDir
|
|
|
|
guardSession acid
|
|
|
|
postEntry acid
|
|
|
|
, do dir "admin" $ nullDir
|
|
|
|
guardSession acid
|
|
|
|
ok $ toResponse $ adminIndex ("tazjin" :: Text)
|
2012-03-14 00:37:00 +01:00
|
|
|
, dir "admin" $ ok $ toResponse $ adminLogin
|
2012-03-09 17:57:53 +01:00
|
|
|
, dir "dologin" $ processLogin acid
|
2012-02-23 03:30:14 +01:00
|
|
|
, serveDirectory DisableBrowsing [] "../res"
|
|
|
|
]
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-03-14 01:36:57 +01:00
|
|
|
{-
|
|
|
|
adminHandler :: AcidState Blog -> ServerPart Response
|
|
|
|
adminHandler acid =
|
|
|
|
msum [ dir "postentry" $ postEntry acid
|
|
|
|
, dir "entrylist" $ dir (show DE) $ entryList DE
|
|
|
|
, dir "entrylist" $ dir (show EN) $ entryList EN
|
|
|
|
, dir "edit" $ path $ \(eId :: Integer) -> editEntry eId
|
|
|
|
, dir "doedit" $ updateEntry
|
|
|
|
, ok $ toResponse $ adminIndex ("tazjin" :: Text) --User NYI
|
|
|
|
]
|
|
|
|
-}
|
|
|
|
|
2012-03-13 05:31:13 +01:00
|
|
|
blogHandler :: AcidState Blog -> BlogLang -> ServerPart Response
|
|
|
|
blogHandler acid lang =
|
|
|
|
msum [ path $ \(eId :: Integer) -> showEntry acid lang $ EntryId eId
|
2012-03-14 00:37:00 +01:00
|
|
|
, do decodeBody tmpPolicy
|
|
|
|
dir "postcomment" $ path $
|
|
|
|
\(eId :: Integer) -> addComment acid lang $ EntryId eId
|
2012-02-23 03:30:14 +01:00
|
|
|
, do nullDir
|
2012-03-13 05:31:13 +01:00
|
|
|
showIndex acid lang
|
2012-02-23 03:30:14 +01:00
|
|
|
]
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-03-07 13:40:47 +01:00
|
|
|
formatOldLink :: Int -> Int -> String -> ServerPart Response
|
|
|
|
formatOldLink y m id_ =
|
|
|
|
flip seeOther (toResponse ()) $
|
|
|
|
concat $ intersperse' "/" ["de", show y, show m, replace '.' '/' id_]
|
|
|
|
|
2012-03-13 05:31:13 +01:00
|
|
|
showEntry :: AcidState Blog -> BlogLang -> EntryId -> ServerPart Response
|
|
|
|
showEntry acid lang eId = do
|
|
|
|
entry <- query' acid (GetEntry eId)
|
2012-03-06 23:34:04 +01:00
|
|
|
ok $ tryEntry entry lang
|
2012-02-23 13:20:29 +01:00
|
|
|
|
2012-03-06 23:34:04 +01:00
|
|
|
tryEntry :: Maybe Entry -> BlogLang -> Response
|
|
|
|
tryEntry Nothing lang = toResponse $ showError NotFound lang
|
|
|
|
tryEntry (Just entry) _ = toResponse $ blogTemplate eLang eTitle $ renderEntry entry
|
2012-02-23 13:20:29 +01:00
|
|
|
where
|
2012-03-13 05:31:13 +01:00
|
|
|
eTitle = T.append ": " (title entry)
|
2012-02-23 13:20:29 +01:00
|
|
|
eLang = lang entry
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-03-13 05:31:13 +01:00
|
|
|
showIndex :: AcidState Blog -> BlogLang -> ServerPart Response
|
|
|
|
showIndex acid lang = do
|
|
|
|
entries <- query' acid (LatestEntries lang)
|
2012-03-03 16:39:15 +01:00
|
|
|
(page :: Maybe Int) <- optional $ lookRead "page"
|
|
|
|
ok $ toResponse $ blogTemplate lang "" $
|
|
|
|
renderEntries False (eDrop page entries) (topText lang) (Just $ showLinks page lang)
|
|
|
|
where
|
|
|
|
eDrop :: Maybe Int -> [a] -> [a]
|
|
|
|
eDrop (Just i) = drop ((i-1) * 6)
|
|
|
|
eDrop Nothing = drop 0
|
2012-02-24 17:01:36 +01:00
|
|
|
|
2012-03-14 00:37:00 +01:00
|
|
|
addComment :: AcidState Blog -> BlogLang -> EntryId -> ServerPart Response
|
|
|
|
addComment acid lang eId = do
|
2012-03-13 05:31:13 +01:00
|
|
|
now <- liftIO $ getCurrentTime >>= return
|
2012-03-14 00:37:00 +01:00
|
|
|
nComment <- Comment <$> pure now
|
|
|
|
<*> lookText' "cname"
|
2012-03-13 05:31:13 +01:00
|
|
|
<*> lookText' "ctext"
|
|
|
|
update' acid (AddComment eId nComment)
|
2012-03-14 00:37:00 +01:00
|
|
|
seeOther ("/" ++ show lang ++ "/" ++ show eId) (toResponse())
|
|
|
|
|
|
|
|
{- ADMIN stuff -}
|
|
|
|
|
|
|
|
|
|
|
|
updateEntry :: ServerPart Response
|
|
|
|
updateEntry = undefined
|
|
|
|
|
|
|
|
postEntry :: AcidState Blog -> ServerPart Response
|
|
|
|
postEntry acid = do
|
2012-03-14 01:36:57 +01:00
|
|
|
decodeBody tmpPolicy
|
2012-03-14 00:37:00 +01:00
|
|
|
now <- liftIO $ getCurrentTime
|
|
|
|
let eId = timeToId now
|
|
|
|
lang <- lookText' "lang"
|
|
|
|
nEntry <- Entry <$> pure eId
|
|
|
|
<*> getLang lang
|
|
|
|
<*> lookText' "author"
|
|
|
|
<*> lookText' "title"
|
|
|
|
<*> lookText' "btext"
|
|
|
|
<*> lookText' "mtext"
|
|
|
|
<*> pure now
|
|
|
|
<*> pure [] -- NYI
|
|
|
|
<*> pure []
|
|
|
|
update' acid (InsertEntry nEntry)
|
|
|
|
seeOther ("/" ++ (T.unpack lang) ++ "/" ++ show eId) (toResponse())
|
|
|
|
where
|
|
|
|
timeToId :: UTCTime -> EntryId
|
|
|
|
timeToId t = EntryId . read $ formatTime defaultTimeLocale "%s" t
|
|
|
|
getLang :: Text -> ServerPart BlogLang
|
|
|
|
getLang "de" = return DE
|
|
|
|
getLang "en" = return EN
|
|
|
|
|
|
|
|
|
|
|
|
entryList :: BlogLang -> ServerPart Response
|
|
|
|
entryList lang = undefined
|
|
|
|
|
|
|
|
editEntry :: Integer -> ServerPart Response
|
|
|
|
editEntry i = undefined
|
|
|
|
where
|
|
|
|
eId = EntryId i
|
|
|
|
|
|
|
|
guardSession :: AcidState Blog -> ServerPartT IO ()
|
|
|
|
guardSession acid = do
|
|
|
|
(sId :: Text) <- readCookieValue "session"
|
|
|
|
(uName :: Text) <- readCookieValue "sUser"
|
|
|
|
now <- liftIO $ getCurrentTime
|
|
|
|
mS <- query' acid (GetSession $ SessionID sId)
|
|
|
|
case mS of
|
|
|
|
Nothing -> mzero
|
|
|
|
(Just Session{..}) -> unless (and [ uName == username user
|
|
|
|
, sessionTimeDiff now sdate])
|
|
|
|
mzero
|
|
|
|
where
|
|
|
|
sessionTimeDiff :: UTCTime -> UTCTime -> Bool
|
|
|
|
sessionTimeDiff now sdate = (diffUTCTime now sdate) < 43200
|
|
|
|
|
2012-03-06 00:50:53 +01:00
|
|
|
|
2012-03-13 05:31:13 +01:00
|
|
|
processLogin :: AcidState Blog -> ServerPart Response
|
2012-03-09 17:57:53 +01:00
|
|
|
processLogin acid = do
|
|
|
|
decodeBody tmpPolicy
|
2012-03-13 05:31:13 +01:00
|
|
|
account <- lookText' "account"
|
2012-03-09 17:57:53 +01:00
|
|
|
password <- look "password"
|
2012-03-13 05:31:13 +01:00
|
|
|
login <- query' acid (CheckUser (Username account) password)
|
|
|
|
if' login
|
2012-03-13 06:35:56 +01:00
|
|
|
(createSession account)
|
2012-03-14 00:37:00 +01:00
|
|
|
(ok $ toResponse $ adminLogin)
|
2012-03-03 03:35:20 +01:00
|
|
|
where
|
2012-03-13 06:35:56 +01:00
|
|
|
createSession account = do
|
|
|
|
now <- liftIO getCurrentTime
|
|
|
|
let sId = hashString $ show now
|
|
|
|
addCookie (MaxAge 43200) (mkCookie "session" $ unpack sId)
|
|
|
|
addCookie (MaxAge 43200) (mkCookie "sUser" $ T.unpack account)
|
|
|
|
(Just user) <- query' acid (GetUser $ Username account)
|
|
|
|
let nSession = Session (T.pack $ unpack sId) user now
|
|
|
|
update' acid (AddSession nSession)
|
|
|
|
seeOther ("/admin?do=login" :: Text) (toResponse())
|
|
|
|
|