yammat/Handler/Avatar.hs

156 lines
4.9 KiB
Haskell
Raw Normal View History

2015-08-09 19:16:33 +00:00
-- yammat - Yet Another MateMAT
-- Copyright (C) 2015 Amedeo Molnár
--
-- This program is free software: you can redistribute it and/or modify
-- it under the terms of the GNU Affero General Public License as published
-- by the Free Software Foundation, either version 3 of the License, or
-- (at your option) any later version.
--
-- This program is distributed in the hope that it will be useful,
-- but WITHOUT ANY WARRANTY; without even the implied warranty of
-- MERCHANTABILITY or FITNESS FOR A PARTICULAR PURPOSE. See the
-- GNU Affero General Public License for more details.
--
-- You should have received a copy of the GNU Affero General Public License
-- along with this program. If not, see <http://www.gnu.org/licenses/>.
2015-04-16 00:12:03 +00:00
module Handler.Avatar where
import Import
import Data.Conduit.Binary
2015-09-16 18:28:30 +00:00
import qualified Data.Text as T
2015-04-16 00:12:03 +00:00
import qualified Data.ByteString as B
import qualified Data.ByteString.Lazy as L
import Data.ByteString.Base64
2015-04-16 00:12:03 +00:00
import Graphics.ImageMagick.MagickWand
2015-09-16 18:28:30 +00:00
import qualified Crypto.Hash.SHA3 as SHA3
2015-04-16 00:12:03 +00:00
getAvatarR :: Handler Html
getAvatarR = do
avatars <- runDB $ selectList [] [Asc AvatarIdent]
2015-09-14 22:49:13 +00:00
defaultLayout $
2015-04-16 00:12:03 +00:00
$(widgetFile "avatars")
getNewAvatarR :: Handler Html
getNewAvatarR = do
2015-09-14 22:49:13 +00:00
(newAvatarWidget, enctype) <- generateFormPost avatarNewForm
defaultLayout $
2015-04-16 00:12:03 +00:00
$(widgetFile "newAvatar")
postNewAvatarR :: Handler Html
postNewAvatarR = do
2015-09-14 22:49:13 +00:00
((res, _), _) <- runFormPost avatarNewForm
2015-04-16 00:12:03 +00:00
case res of
FormSuccess na -> do
raw <- runResourceT $ fileSource (avatarNewFile na) $$ sinkLbs
2015-09-16 18:28:30 +00:00
(thumb, hash) <- generateThumb $ B.concat $ L.toChunks raw
runDB $ insert_ $ Avatar (avatarNewIdent na) thumb hash
2015-04-16 00:12:03 +00:00
setMessageI MsgAvatarUploadSuccessfull
2015-09-14 22:49:13 +00:00
redirect HomeR
2015-04-16 00:12:03 +00:00
_ -> do
setMessageI MsgErrorOccured
2015-09-14 22:49:13 +00:00
redirect NewAvatarR
2015-04-16 00:12:03 +00:00
avatarNewForm :: Form AvatarNew
avatarNewForm = renderDivs $ AvatarNew
<$> areq textField (fieldSettingsLabel MsgAvatarIdent) Nothing
<*> areq fileField (fieldSettingsLabel MsgAvatarFile) Nothing
data AvatarNew = AvatarNew
{ avatarNewIdent :: Text
, avatarNewFile :: FileInfo
}
getModifyAvatarR :: AvatarId -> Handler Html
getModifyAvatarR aId = do
ma <- runDB $ get aId
case ma of
Just avatar -> do
(avatarModifyWidget, enctype) <- generateFormPost $ avatarModForm avatar
2015-09-14 22:49:13 +00:00
defaultLayout $
2015-04-16 00:12:03 +00:00
$(widgetFile "modifyAvatar")
Nothing -> do
setMessageI MsgAvatarUnknown
2015-09-14 22:49:13 +00:00
redirect AvatarR
2015-04-16 00:12:03 +00:00
postModifyAvatarR :: AvatarId -> Handler Html
postModifyAvatarR aId = do
ma <- runDB $ get aId
case ma of
Just avatar -> do
((res, _), _) <- runFormPost $ avatarModForm avatar
case res of
FormSuccess md -> do
updateAvatar aId md
setMessageI MsgAvatarUpdateSuccessfull
2015-09-14 22:49:13 +00:00
redirect AvatarR
2015-04-16 00:12:03 +00:00
_ -> do
setMessageI MsgErrorOccured
redirect $ ModifyAvatarR aId
Nothing -> do
setMessageI MsgAvatarUnknown
2015-09-14 22:49:13 +00:00
redirect HomeR
2015-04-16 00:12:03 +00:00
avatarModForm :: Avatar -> Form AvatarMod
avatarModForm a = renderDivs $ AvatarMod
<$> areq textField (fieldSettingsLabel MsgAvatarIdent) (Just $ avatarIdent a)
<*> aopt fileField (fieldSettingsLabel MsgAvatarFileChange) Nothing
data AvatarMod = AvatarMod
{ avatarModIdent :: Text
, avatarModFile :: Maybe FileInfo
}
updateAvatar :: AvatarId -> AvatarMod -> Handler ()
2015-09-14 22:49:13 +00:00
updateAvatar aId (AvatarMod ident Nothing) =
2015-04-16 00:12:03 +00:00
runDB $ update aId [AvatarIdent =. ident]
updateAvatar aId (AvatarMod ident (Just fi)) = do
raw <- runResourceT $ fileSource fi $$ sinkLbs
2015-09-16 18:28:30 +00:00
(thumb, hash) <- generateThumb $ B.concat $ L.toChunks raw
2015-04-16 00:12:03 +00:00
runDB $ update aId
[ AvatarIdent =. ident
, AvatarData =. thumb
2015-09-16 18:28:30 +00:00
, AvatarHash =. hash
2015-04-16 00:12:03 +00:00
]
2015-09-16 18:28:30 +00:00
generateThumb :: ByteString -> Handler (ByteString, ByteString)
generateThumb raw = do
thumb <- liftIO $ withMagickWandGenesis $ do
2015-04-16 00:12:03 +00:00
(_, w) <- magickWand
readImageBlob w raw
w1 <- getImageWidth w
h1 <- getImageHeight w
2015-09-16 16:47:36 +00:00
let h2 = 140 :: Int
let w2 = floor (fromIntegral w1 / fromIntegral h1 * fromIntegral h2 :: Double) :: Int
2015-04-16 00:12:03 +00:00
resizeImage w w2 h2 lanczosFilter 1
setImageCompressionQuality w 95
setImageFormat w "png"
getImageBlob w
2015-09-17 14:15:46 +00:00
let h = encode (SHA3.hash 32 thumb)
2015-09-16 18:28:30 +00:00
return (thumb, h)
2015-04-16 00:12:03 +00:00
getGetAvatarR :: AvatarId -> Handler TypedContent
getGetAvatarR aId = do
avatar <- runDB $ get404 aId
2015-09-16 18:28:30 +00:00
setEtag $ decodeUtf8 $ avatarHash avatar
2015-04-16 00:12:03 +00:00
return $ TypedContent typePng $ toContent $ avatarData avatar
2015-04-16 01:12:05 +00:00
getAvatarDeleteR :: AvatarId -> Handler Html
getAvatarDeleteR aId = do
ma <- runDB $ get aId
case ma of
Just _ -> do
c <- runDB $ selectList [UserAvatar ==. Just aId] []
2015-06-23 23:48:06 +00:00
d <- runDB $ selectList [BeverageAvatar ==. Just aId] []
2015-10-11 18:07:12 +00:00
e <- runDB $ selectList [SupplierAvatar ==. Just aId] []
if null c && null d && null e
2015-09-14 22:49:13 +00:00
then do
runDB $ delete aId
setMessageI MsgAvatarDeleted
2015-09-14 22:49:13 +00:00
redirect HomeR
else do
setMessageI MsgAvatarInUseError
2015-09-14 22:49:13 +00:00
redirect AvatarR
2015-04-16 01:12:05 +00:00
Nothing -> do
setMessageI MsgAvatarUnknown
2015-09-14 22:49:13 +00:00
redirect AvatarR