about summary refs log tree commit diff
path: root/src/API.hs
diff options
context:
space:
mode:
authorWilliam Carroll <wpcarro@gmail.com>2020-07-24T18·00+0100
committerWilliam Carroll <wpcarro@gmail.com>2020-07-24T18·00+0100
commit660b8d43e5272e2b71b6092b4c879a82c4d861a8 (patch)
tree08e2be141393a591349618d7b8a426887f79ae21 /src/API.hs
parentec90748b827edcd465020acd5bd23ae6a01ba37a (diff)
Support a basic API
Use Servant to create a REST API supporting the following routes:
- GET /number
- POST /other

The server interacts with a SQLite database.
Diffstat (limited to 'src/API.hs')
-rw-r--r--src/API.hs39
1 files changed, 39 insertions, 0 deletions
diff --git a/src/API.hs b/src/API.hs
new file mode 100644
index 000000000000..b2c7fd57d67f
--- /dev/null
+++ b/src/API.hs
@@ -0,0 +1,39 @@
+{-# LANGUAGE DataKinds #-}
+{-# LANGUAGE TypeApplications #-}
+{-# LANGUAGE DeriveGeneric #-}
+{-# LANGUAGE TypeOperators #-}
+{-# LANGUAGE KindSignatures #-}
+{-# LANGUAGE OverloadedStrings #-}
+--------------------------------------------------------------------------------
+module API where
+--------------------------------------------------------------------------------
+import qualified Data.Pool as DP
+import qualified Database.SQLite.Simple as DB
+
+import Data.Aeson
+import GHC.Generics
+import GHC.TypeLits
+import Network.Wai.Handler.Warp
+import Servant
+import Control.Monad.IO.Class
+--------------------------------------------------------------------------------
+
+handlers :: DP.Pool DB.Connection -> Server API
+handlers pool = do
+  getHandler pool :<|> pure 0
+
+getHandler :: DP.Pool DB.Connection -> Handler Int
+getHandler pool =
+  DP.withResource pool $ \conn -> do
+     result <- liftIO $ DB.query_ conn "select 2 + 2"
+     case result of
+       [DB.Only x] -> pure x
+       _  -> pure (-1)
+
+type API = "number" :> Get '[JSON] Int
+      :<|> "other" :> Post '[JSON] Int
+
+main :: IO ()
+main = do
+  pool <- DP.createPool (DB.open "data.db") DB.close 1 0.5 1
+  run 3000 (serve (Proxy @ API) (handlers pool))