{-# LANGUAGE OverloadedStrings, QuasiQuotes #-} module Clckwrks.Authenticate.Page.Login where import Control.Applicative ((<$>)) import Clckwrks.Monad (ClckT, ThemeStyleId(..), plugins, themeTemplate) import Clckwrks.Authenticate.URL import Clckwrks.URL (ClckURL) import Control.Monad.State (get) import Happstack.Server (Response, ServerPartT) import HSP import Language.Haskell.HSX.QQ (hsx) loginPage :: ClckT ClckURL (ServerPartT IO) Response loginPage = do plugins <- plugins <$> get themeTemplate plugins (ThemeStyleId 0) "Login" () [hsx|

Login

Forgotten Password?

Forgot your password? Request a reset link via email!

Logout

You have successfully logged in! Click the link below to logout.

Create A New Account

|]