yammat/Handler/Restock.hs

98 lines
3.1 KiB
Haskell
Raw Normal View History

2015-08-09 21:16:33 +02: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-04 06:46:33 +02:00
module Handler.Restock where
import Import
import Handler.Common
import Data.Maybe (fromJust)
2015-04-04 06:46:33 +02:00
getRestockR :: Handler Html
getRestockR = do
2015-04-09 13:47:27 +02:00
beverages <- runDB $ selectList [] [Asc BeverageIdent]
2015-09-15 00:49:13 +02:00
defaultLayout $
2015-04-04 06:46:33 +02:00
$(widgetFile "restock")
getUpstockR :: BeverageId -> Handler Html
getUpstockR bId = do
mBev <- runDB $ get bId
case mBev of
Just bev -> do
(upstockWidget, enctype) <- generateFormPost upstockForm
2015-09-15 00:49:13 +02:00
defaultLayout $
2015-04-04 06:46:33 +02:00
$(widgetFile "upstock")
Nothing -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgItemUnknown
2015-09-15 00:49:13 +02:00
redirect HomeR
2015-04-04 06:46:33 +02:00
postUpstockR :: BeverageId -> Handler Html
postUpstockR bId = do
mBev <- runDB $ get bId
case mBev of
2015-09-15 00:49:13 +02:00
Just _ -> do
2015-04-04 06:46:33 +02:00
((res, _), _) <- runFormPost upstockForm
case res of
2015-09-15 00:49:13 +02:00
FormSuccess c ->
if c > 0
then do
2015-04-04 06:46:33 +02:00
runDB $ update bId [BeverageAmount +=. c]
2015-04-10 00:40:58 +02:00
setMessageI MsgStockedUp
2015-09-15 00:49:13 +02:00
redirect HomeR
else do
2015-04-10 00:40:58 +02:00
setMessageI MsgNotStockedUp
2015-04-04 06:46:33 +02:00
redirect $ UpstockR bId
_ -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgStockupError
2015-04-04 06:46:33 +02:00
redirect $ UpstockR bId
Nothing -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgItemUnknown
2015-09-15 00:49:13 +02:00
redirect HomeR
2015-04-04 06:46:33 +02:00
upstockForm :: Form Int
upstockForm = renderDivs
2015-04-13 14:09:47 +02:00
$ areq amountField (fieldSettingsLabel MsgAmountAdded) (Just 1)
2015-04-04 06:46:33 +02:00
getNewArticleR :: Handler Html
getNewArticleR = do
(newArticleWidget, enctype) <- generateFormPost newArticleForm
2015-09-15 00:49:13 +02:00
defaultLayout $
2015-04-04 06:46:33 +02:00
$(widgetFile "newArticle")
postNewArticleR :: Handler Html
postNewArticleR = do
((result, _), _) <- runFormPost newArticleForm
case result of
FormSuccess bev -> do
runDB $ insert_ bev
2015-04-10 00:40:58 +02:00
setMessageI MsgItemAdded
2015-09-15 00:49:13 +02:00
redirect HomeR
2015-04-04 06:46:33 +02:00
_ -> do
2015-04-10 00:40:58 +02:00
setMessageI MsgItemNotAdded
2015-09-15 00:49:13 +02:00
redirect HomeR
2015-04-04 06:46:33 +02:00
newArticleForm :: Form Beverage
newArticleForm = renderDivs $ Beverage
2015-04-10 00:40:58 +02:00
<$> areq textField (fieldSettingsLabel MsgName) Nothing
<*> areq currencyField (fieldSettingsLabel MsgPrice) (Just 100)
<*> areq amountField (fieldSettingsLabel MsgAmount) (Just 0)
<*> areq amountField (fieldSettingsLabel MsgAmountWarning) (Just 0)
2015-05-19 05:37:22 +02:00
<*> pure 0
2015-05-03 18:01:30 +02:00
<*> areq volumeField (fieldSettingsLabel MsgVolume) (Just 500)
2015-04-16 02:51:08 +02:00
<*> aopt (selectField avatars) (fieldSettingsLabel MsgSelectAvatar) Nothing
2015-04-16 02:12:03 +02:00
where
2015-04-16 02:51:08 +02:00
avatars = do
2015-04-16 02:12:03 +02:00
ents <- runDB $ selectList [] [Asc AvatarIdent]
2015-09-15 00:49:13 +02:00
optionsPairs $ map (\ent -> (avatarIdent $ entityVal ent, entityKey ent)) ents