2012-02-23 13:20:29 +01:00
|
|
|
{-# LANGUAGE OverloadedStrings, ScopedTypeVariables #-}
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
module Main where
|
|
|
|
|
2012-02-23 03:30:14 +01:00
|
|
|
import Control.Monad (msum, mzero)
|
|
|
|
import Data.Monoid (mempty)
|
|
|
|
import Data.ByteString.Char8 (ByteString)
|
|
|
|
import Data.Text hiding (map, length, zip, head)
|
|
|
|
import Data.Time
|
|
|
|
import Database.CouchDB
|
|
|
|
import Happstack.Server
|
2012-02-23 13:20:29 +01:00
|
|
|
import Network.CGI (liftIO)
|
2012-02-22 22:03:31 +01:00
|
|
|
import Text.Blaze (toValue, preEscapedString)
|
|
|
|
import Text.Blaze.Html5 (Html, (!), a, form, input, p, toHtml, label)
|
|
|
|
import Text.Blaze.Html5.Attributes (action, enctype, href, name, size, type_, value)
|
|
|
|
import qualified Text.Blaze.Html5 as H
|
|
|
|
import qualified Text.Blaze.Html5.Attributes as A
|
2012-02-23 03:30:14 +01:00
|
|
|
import Text.JSON.Generic
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-02-23 03:30:14 +01:00
|
|
|
import Blog
|
2012-02-24 16:06:33 +01:00
|
|
|
import Locales
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
tmpPolicy :: BodyPolicy
|
|
|
|
tmpPolicy = (defaultBodyPolicy "./tmp/" 0 1000 1000)
|
|
|
|
|
|
|
|
main :: IO()
|
|
|
|
main = do
|
2012-02-23 03:30:14 +01:00
|
|
|
putStrLn ("TazBlog " ++ version ++ " in Haskell starting")
|
|
|
|
simpleHTTP nullConf tazBlog
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
tazBlog :: ServerPart Response
|
|
|
|
tazBlog = do
|
2012-02-24 16:06:33 +01:00
|
|
|
msum [ dir (show DE) $ blogHandler DE
|
|
|
|
, dir (show EN) $ blogHandler EN
|
2012-02-23 03:30:14 +01:00
|
|
|
, do nullDir
|
2012-02-24 05:20:36 +01:00
|
|
|
showIndex DE
|
2012-02-23 03:30:14 +01:00
|
|
|
, do dir " " $ nullDir
|
|
|
|
seeOther ("https://plus.google.com/115916629925754851590" :: String) (toResponse ())
|
|
|
|
, dir "res" $ serveDirectory DisableBrowsing [] "../res"
|
|
|
|
, serveDirectory DisableBrowsing [] "../res"
|
|
|
|
]
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
blogHandler :: BlogLang -> ServerPart Response
|
|
|
|
blogHandler lang =
|
2012-02-23 03:30:14 +01:00
|
|
|
msum [ path $ \(year :: Int) -> path $ \(month :: Int) -> path $ --single entry
|
2012-02-23 13:20:29 +01:00
|
|
|
\(day :: Int) -> path $ \(id_ :: String) -> showEntry year month day id_
|
2012-02-24 17:01:36 +01:00
|
|
|
, path $ \(year :: Int ) -> path $ \(month :: Int) -> showMonth year month lang
|
2012-02-23 03:30:14 +01:00
|
|
|
, do nullDir
|
2012-02-24 05:20:36 +01:00
|
|
|
showIndex lang
|
2012-02-23 03:30:14 +01:00
|
|
|
]
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-02-23 13:20:29 +01:00
|
|
|
showEntry :: Int -> Int -> Int -> String -> ServerPart Response
|
|
|
|
showEntry y m d i = do
|
|
|
|
entryJS <- liftIO $ runCouchDB' $ getDoc (db "tazblog") (doc i)
|
|
|
|
let entry = maybeDoc entryJS
|
|
|
|
ok $ tryEntry entry
|
|
|
|
|
|
|
|
tryEntry :: Maybe Entry -> Response
|
|
|
|
tryEntry Nothing = toResponse $ showError NotFound
|
2012-03-02 09:12:09 +01:00
|
|
|
tryEntry (Just entry) = toResponse $ blogTemplate eLang eTitle $ renderEntry entry
|
2012-02-23 13:20:29 +01:00
|
|
|
where
|
2012-03-02 09:12:09 +01:00
|
|
|
eTitle = ": " ++ title entry
|
2012-02-23 13:20:29 +01:00
|
|
|
eLang = lang entry
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-02-24 05:20:36 +01:00
|
|
|
showIndex :: BlogLang -> ServerPart Response
|
|
|
|
showIndex lang = do
|
2012-03-03 04:02:30 +01:00
|
|
|
entries <- getLatest lang [("limit", toJSON (6 :: Int)), ("descending", toJSON True)]
|
|
|
|
ok $ toResponse $ blogTemplate lang "" $ renderEntries entries (topText lang)
|
2012-02-24 17:01:36 +01:00
|
|
|
|
|
|
|
showMonth :: Int -> Int -> BlogLang -> ServerPart Response
|
|
|
|
showMonth y m lang = do
|
|
|
|
entries <- getLatest lang $ makeQuery startkey endkey
|
2012-03-02 09:12:09 +01:00
|
|
|
ok $ toResponse $ blogTemplate lang month
|
2012-03-03 04:02:30 +01:00
|
|
|
$ renderEntries entries month
|
2012-02-24 05:20:36 +01:00
|
|
|
where
|
2012-03-02 09:12:09 +01:00
|
|
|
month = getMonth lang y m
|
2012-02-24 17:01:36 +01:00
|
|
|
startkey = JSArray [toJSON y, toJSON m]
|
|
|
|
endkey = JSArray [toJSON y, toJSON m, JSObject (toJSObject [] )]
|
|
|
|
|
2012-02-22 22:03:31 +01:00
|
|
|
-- http://tazj.in/2012/02/10.155234
|
|
|
|
|
2012-02-23 13:20:29 +01:00
|
|
|
-- CouchDB functions
|
2012-02-24 05:20:36 +01:00
|
|
|
getLatest :: BlogLang -> [(String, JSValue)] -> ServerPart [Entry]
|
|
|
|
getLatest lang arg = do
|
|
|
|
queryResult <- queryDB view arg
|
|
|
|
let entries = map (stripResult . fromJSON . snd) queryResult
|
|
|
|
return entries
|
|
|
|
where
|
|
|
|
view = case lang of
|
|
|
|
EN -> "latestEN"
|
|
|
|
DE -> "latestDE"
|
|
|
|
|
2012-02-24 17:01:36 +01:00
|
|
|
makeQuery :: JSON a => a -> a -> [(String, JSValue)]
|
|
|
|
makeQuery qsk qek = [("startkey", (showJSON qsk))
|
|
|
|
,("endkey", (showJSON qek))]
|
|
|
|
|
2012-02-24 05:20:36 +01:00
|
|
|
queryDB :: JSON a => String -> [(String, JSValue)] -> ServerPart [(Doc, a)]
|
2012-03-03 03:35:20 +01:00
|
|
|
queryDB view arg = liftIO . runCouchDB' $ queryView (db "tazblog") (doc "entries") (doc view) arg
|
2012-02-24 05:20:36 +01:00
|
|
|
|
2012-02-23 13:20:29 +01:00
|
|
|
maybeDoc :: Data a => Maybe (Doc, Rev, JSValue) -> Maybe a
|
|
|
|
maybeDoc (Just(_,_,v)) = Just( stripResult $ fromJSON v)
|
|
|
|
maybeDoc Nothing = Nothing
|
|
|
|
|
|
|
|
stripResult :: Result a -> a
|
|
|
|
stripResult (Ok z) = z
|
|
|
|
stripResult (Error s) = error $ "JSON error: " ++ s
|
2012-02-24 17:01:36 +01:00
|
|
|
|
2012-03-03 03:47:11 +01:00
|
|
|
getMonthCount :: BlogLang -> Int -> Int -> ServerPart Int
|
|
|
|
getMonthCount lang y m = do
|
|
|
|
count <- queryDB (view lang) $ makeQuery startkey endkey
|
2012-03-03 03:42:44 +01:00
|
|
|
return . stripCount $ map (stripResult . fromJSON . snd) count
|
2012-03-03 03:35:20 +01:00
|
|
|
where
|
|
|
|
startkey = JSArray [toJSON ("count" :: String), toJSON y, toJSON m]
|
|
|
|
endkey = JSArray [toJSON ("count" :: String), toJSON y, toJSON m, JSObject (toJSObject [] )]
|
|
|
|
stripCount :: [Int] -> Int
|
|
|
|
stripCount [x] = x
|
|
|
|
stripCount [] = 0
|
2012-03-03 03:47:11 +01:00
|
|
|
view DE = "countDE"
|
|
|
|
view EN = "countEN"
|
2012-03-03 03:35:20 +01:00
|
|
|
|
|
|
|
|
2012-02-22 22:03:31 +01:00
|
|
|
-- CouchDB View Setup
|
2012-03-02 09:12:09 +01:00
|
|
|
latestDEView = "function(doc){ if(doc.lang == 'DE'){ emit([doc.year, doc.month, doc.day, doc._id], doc); } }"
|
|
|
|
latestENView = "function(doc){ if(doc.lang == 'EN'){ emit([doc.year, doc.month, doc.day, doc._id], doc); } }"
|
2012-03-03 03:47:11 +01:00
|
|
|
countDEView = "function(doc){ if(doc.lang == 'DE'){ emit(['count', doc.year, doc.month, doc.day, doc._id], 1); } }"
|
|
|
|
countENView = "function(doc){ if(doc.lang == 'EN'){ emit(['count', doc.year, doc.month, doc.day, doc._id], 1); } }"
|
2012-03-03 03:35:20 +01:00
|
|
|
countReduce = "function(keys, values, rereduce) { return sum(values); }"
|
2012-02-22 22:03:31 +01:00
|
|
|
|
|
|
|
latestDE = ViewMap "latestDE" latestDEView
|
|
|
|
latestEN = ViewMap "latestEN" latestENView
|
2012-03-02 09:12:09 +01:00
|
|
|
countDE = ViewMapReduce "countDE" countDEView countReduce
|
|
|
|
countEN = ViewMapReduce "countEN" countENView countReduce
|
2012-02-22 22:03:31 +01:00
|
|
|
|
2012-02-23 03:30:14 +01:00
|
|
|
setupBlogViews :: IO ()
|
2012-02-22 22:03:31 +01:00
|
|
|
setupBlogViews = runCouchDB' $
|
2012-03-02 09:12:09 +01:00
|
|
|
newView "tazblog" "entries" [latestDE, latestEN, countDE, countEN]
|