{-# LANGUAGE QuasiQuotes #-} module Happstack.Authenticate.Password.Forms where import HSP import Happstack.Server.HSP.HTML () import Language.Haskell.HSX.QQ (hsx) import Happstack.Authenticate.Core (AuthenticateURL) import Happstack.Authenticate.Password.URL (PasswordURL) import Web.Routes import Web.Routes.XMLGenT () -- usernamePasswordDiv x = --
-- FIXME: there should be a way to include this via an angular directive usernamePasswordForm :: (Functor m, Monad m) => XMLGenT (RouteT AuthenticateURL m) XML usernamePasswordForm = [hsx|
<% " " %>
<% " " %>
{{username_password_error}}
Logout
|]