yammat/Handler/NewUser.hs

106 lines
3.0 KiB
Haskell
Raw Normal View History

2015-04-04 06:46:33 +02:00
module Handler.NewUser where
2015-04-07 22:03:21 +02:00
import Import as I
import Handler.Common
2015-04-04 06:46:33 +02:00
import Text.Read
import Text.Shakespeare.Text
2015-04-04 06:46:33 +02:00
getNewUserR :: Handler Html
getNewUserR = do
time <- liftIO getCurrentTime
secs <- return $ read $ formatTime defaultTimeLocale "%s" time
(newUserWidget, enctype) <- generateFormPost $ newUserForm secs
defaultLayout $ do
$(widgetFile "newUser")
postNewUserR :: Handler Html
postNewUserR = do
time <- liftIO getCurrentTime
secs <- return $ read $ formatTime defaultTimeLocale "%s" time
((res, _), _) <- runFormPost $ newUserForm secs
case res of
FormSuccess user -> do
_ <- runDB $ insert user
2015-04-10 00:40:58 +02:00
setMessageI MsgUserCreated
2015-04-04 06:46:33 +02:00
redirect $ HomeR
_ -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgUserNotCreated
2015-04-04 06:46:33 +02:00
redirect $ NewUserR
newUserForm :: Int -> Form User
newUserForm secs = renderDivs $ User
2015-04-10 00:40:58 +02:00
<$> areq textField (fieldSettingsLabel MsgName) Nothing
2015-04-04 06:46:33 +02:00
<*> pure 0
<*> pure secs
<*> aopt emailField (fieldSettingsLabel MsgEmailNotify) Nothing
2015-04-16 02:12:03 +02:00
<*> aopt (selectField avatars) (fieldSettingsLabel MsgSelectAvatar) Nothing
where
avatars = do
ents <- runDB $ selectList [] [Asc AvatarIdent]
optionsPairs $ map (\ent -> ((avatarIdent $ entityVal ent), entityKey ent)) ents
2015-04-07 22:03:21 +02:00
data UserConf = UserConf
{ userConfEmail :: Maybe Text
2015-04-16 02:51:08 +02:00
, userConfAvatar :: Maybe AvatarId
2015-04-07 22:03:21 +02:00
}
getModifyUserR :: UserId -> Handler Html
getModifyUserR uId = do
mUser <- runDB $ I.get uId
case mUser of
Just user -> do
(modifyUserWidget, enctype) <- generateFormPost $ modifyUserForm user
defaultLayout $ do
$(widgetFile "modifyUser")
Nothing -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgUserUnknown
2015-04-07 22:03:21 +02:00
redirect $ HomeR
postModifyUserR :: UserId -> Handler Html
postModifyUserR uId = do
mUser <- runDB $ I.get uId
case mUser of
Just user -> do
((res, _), _) <- runFormPost $ modifyUserForm user
case res of
2015-04-16 02:51:08 +02:00
FormSuccess uc -> do
2015-04-07 22:03:21 +02:00
runDB $ update uId
2015-04-16 02:51:08 +02:00
[ UserEmail =. userConfEmail uc
, UserAvatar =. userConfAvatar uc
2015-04-07 22:03:21 +02:00
]
2015-04-16 02:51:08 +02:00
liftIO $ notify user (userConfEmail uc)
2015-04-10 00:40:58 +02:00
setMessageI MsgUserEdited
2015-04-07 22:03:21 +02:00
redirect $ SelectR uId
_ -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgUserNotEdited
2015-04-07 22:03:21 +02:00
redirect $ SelectR uId
Nothing -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgUserUnknown
2015-04-07 22:03:21 +02:00
redirect $ HomeR
2015-04-16 02:51:08 +02:00
modifyUserForm :: User -> Form UserConf
modifyUserForm user = renderDivs $ UserConf
<$> aopt emailField (fieldSettingsLabel MsgEmailNotify) (Just $ userEmail user)
<*> aopt (selectField avatars) (fieldSettingsLabel MsgSelectAvatar) (Just $ userAvatar user)
where
avatars = do
ents <- runDB $ selectList [] [Asc AvatarIdent]
optionsPairs $ map (\ent -> ((avatarIdent $ entityVal ent), entityKey ent)) ents
notify :: User -> Maybe Text -> IO ()
notify user email
| (userEmail user) == email = return ()
2015-04-09 23:18:47 +02:00
| otherwise = case userEmail user of
Just address -> sendMail address "Profiländerung"
2015-04-09 23:18:47 +02:00
[stext|
Hallo #{userIdent user},
deine Profileinstellungen wurden geändert.
Nur damit du Bescheid weißt.
Grüße,
der Matemat
2015-04-09 23:18:47 +02:00
|]
Nothing -> return ()