coupon-servant/src/App.hs

135 lines
5.8 KiB
Haskell
Raw Normal View History

{-# LANGUAGE DataKinds #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
module App where
import Api
2017-05-06 12:34:13 +00:00
import Control.Monad
import Control.Monad.IO.Class
2017-05-06 12:34:13 +00:00
import Control.Monad.Logger (runStderrLoggingT)
2017-05-06 16:03:22 +00:00
import Control.Monad.Trans.Reader
2017-05-06 12:34:13 +00:00
import Data.Maybe
import Data.String.Conversions
import Data.Text
2017-05-07 03:51:28 +00:00
import Data.Time.Clock
import Database.Persist
import Database.Persist.Postgresql
import Database.Persist.Sqlite
import Network.Wai
2017-05-06 12:34:13 +00:00
import Network.Wai.Handler.Warp as Warp
import Network.Wai.Middleware.Cors
2017-05-06 12:34:13 +00:00
import Network.Wai.Middleware.RequestLogger (logStdoutDev)
import Servant
2017-05-06 09:55:27 +00:00
import SwaggerGen
couponServer :: ConnectionPool -> Server CouponApi
couponServer pool =
couponAddH :<|> couponGetH :<|> couponDelH
where
couponAddH newCoupon = liftIO $ couponAdd newCoupon
couponGetH code = liftIO $ couponGet code
couponDelH code = liftIO $ couponDel code
2017-05-06 12:34:13 +00:00
couponAdd :: Coupon -> IO NoContent
couponAdd newCoupon = flip runSqlPersistMPool pool $ do
2017-05-07 03:51:28 +00:00
-- exists <- selectFirst [CouponCode ==. couponCode newCoupon] []
upsert newCoupon [CouponValue =. couponValue newCoupon,
CouponMin_price =. couponMin_price newCoupon]
-- TODO Add more upsert cols
-- when (isNothing exists) $ void $ insert newCoupon
2017-05-06 12:34:13 +00:00
return NoContent
couponGet :: Text -> IO (Maybe Coupon)
couponGet code = flip runSqlPersistMPool pool $ do
mUser <- selectFirst [CouponCode ==. code] []
return $ entityVal <$> mUser
2017-05-06 12:34:13 +00:00
couponDel :: Text -> IO NoContent
couponDel code = flip runSqlPersistMPool pool $ do
deleteWhere [CouponCode ==. code]
2017-05-06 12:34:13 +00:00
return NoContent
2017-05-06 16:03:22 +00:00
-- computeBillCoupon :: Coupon -> BillCoupon -> CouponResult
-- computeBillCoupon c b = Applied 1000
billCouponServer :: ConnectionPool -> Server BillCouponApi
2017-05-06 16:03:22 +00:00
billCouponServer pool = liftIO.compute
where compute bill = runSqlPersistMPool (query bill) pool
query bill = do mcpn <- selectFirst [CouponCode ==. coupon bill] []
case mcpn of
2017-05-07 03:51:28 +00:00
Just cpn -> computeBill (entityVal cpn) bill
Nothing -> return $ Rejected "Coupon Not Found"
computeBill :: ( MonadIO m) => Coupon -> BillCoupon -> ReaderT SqlBackend m CouponResult
computeBill c b = do pc <- mapM prodCoupon $ productList b
cm <- selectFirst [CustomerCouponCode ==. couponCode c,
CustomerCouponEmail ==. customer b] []
let mcm = customerLimit $ entityVal <$> cm
ct <- liftIO getCurrentTime
let valid = couponCount && True `elem` pc && mcm && couponTime ct
liftIO $ do print pc
print couponCount
print mcm
print $ couponTime ct
if valid
then return.Applied $ computeBillAmount c b
else return.Rejected $ "Rejected Coupon Invalid"
where prodCoupon k = do p <- selectFirst [ProductCouponCode ==. couponCode c,
ProductCouponProduct ==. productName k] []
return $ productLimit $ entityVal <$> p
couponCount = couponUsed c < couponUsage_limit c
couponTime ct = couponValid_from c < ct && couponValid_till c > ct
productLimit (Just pc) = productCouponUsage pc > couponProduct_limit c
productLimit _ = True
customerLimit (Just cp) = customerCouponUsage cp > couponCustomer_limit c
customerLimit _ = True
computeBillAmount :: Coupon -> BillCoupon -> Int
computeBillAmount _ _ = 100
2017-05-06 16:03:22 +00:00
productFlat :: (Monad m) => CouponForProduct -> BillCoupon -> m CouponResult
productFlat p bill = return (Rejected "Coupon ProductFlat Found")
cartFlat :: (Monad m) => Int -> BillCoupon -> m CouponResult
cartFlat p bill = return (Rejected "Coupon CartFlat Found")
cartPerCent :: (Monad m) => Int -> BillCoupon -> m CouponResult
cartPerCent p bill = return (Rejected "Coupon CartPercent Found")
2017-05-06 09:55:27 +00:00
swaggerServer :: Server SwaggerApi
swaggerServer = liftIO $ return $ swaggerDoc couponApi
server :: ConnectionPool -> Server ServerApi
2017-05-06 09:55:27 +00:00
server pool = couponServer pool :<|> billCouponServer pool :<|> swaggerServer
app :: ConnectionPool -> Application
2017-05-06 12:34:13 +00:00
app pool = serve couponApi $ couponServer pool :<|> billCouponServer pool
2017-05-06 12:34:13 +00:00
appDebug :: ConnectionPool -> Application
appDebug pool = logStdoutDev $ cors (const $ Just policy) $ serve api $ server pool
where policy = simpleCorsResourcePolicy { corsRequestHeaders = ["Content-Type"] }
mkApp :: String -> IO Application
mkApp sqliteFile = do
pool <- runStderrLoggingT $ createPostgresqlPool (cs sqliteFile) 5
runSqlPool (runMigration migrateAll) pool
return $ app pool
2017-05-06 12:34:13 +00:00
mkDebugPgApp :: String -> IO Application
mkDebugPgApp sqliteFile = do
pool <- runStderrLoggingT $ createPostgresqlPool (cs sqliteFile) 5
runSqlPool (runMigration migrateAll) pool
return $ appDebug pool
mkSqliteApp :: String -> IO Application
mkSqliteApp sqliteFile = do
pool <- runStderrLoggingT $ createSqlitePool (cs sqliteFile) 5
runSqlPool (runMigration migrateAll) pool
2017-05-06 12:34:13 +00:00
return $ appDebug pool
run :: String -> IO ()
2017-05-07 03:51:28 +00:00
run dbConnStr = Warp.run 3000 =<< mkDebugPgApp dbConnStr