Browse Source

Use stm-containers Map in memory for concurrent read/writes

master
Julian Ospald 1 year ago
parent
commit
7d52862780
Signed by: hasufell <hasufell@hasufell.de> GPG Key ID: 3786C5262ECB4A3F
5 changed files with 30 additions and 11 deletions
  1. +4
    -2
      app/Main.hs
  2. +1
    -1
      lib/Soostone.hs
  3. +19
    -7
      lib/Soostone/Handlers.hs
  4. +4
    -1
      lib/Soostone/Types.hs
  5. +2
    -0
      soostone.cabal

+ 4
- 2
app/Main.hs View File

@@ -3,7 +3,7 @@

module Main where

import Soostone ( app, middleWare, AppState(AppState, sqliteFile) )
import Soostone ( app, middleWare, AppState(AppState, sqliteFile, stmMap) )

import Control.Monad ( void, when )
import Data.Version (showVersion)
@@ -34,6 +34,7 @@ import Prometheus ( register )
import Prometheus.Metric.GHC ( ghcMetrics )
import Prometheus.Metric.Proc ( procMetrics )
import Text.Read ( readEither )
import qualified StmContainers.Map as SM


versioner :: Parser (a -> a)
@@ -98,7 +99,8 @@ main = do
case serverCommand of
Run ServerConfig{..} -> do
when (sqliteDB == ":memory:") $ fail "In-memory DB is not supported!"
let appState = AppState { sqliteFile = sqliteDB }
m <- SM.newIO
let appState = AppState { sqliteFile = sqliteDB, stmMap = m }
void $ register ghcMetrics
void $ register procMetrics
run serverPort (middleWare $ app appState)


+ 1
- 1
lib/Soostone.hs View File

@@ -27,7 +27,7 @@ app !s = \req resp ->
serve api (hoistServer api nt soostoneServer) req resp
where
nt :: AppM a -> Handler a
nt x = flip runReaderT s $ runAppM x
nt x = flip runReaderT s $ runAppM x


middleWare :: Middleware


+ 19
- 7
lib/Soostone/Handlers.hs View File

@@ -4,7 +4,7 @@
module Soostone.Handlers where

import Soostone.Types
( AppState(AppState, sqliteFile), AppM, Count(..), Key )
( AppState(AppState, sqliteFile, stmMap), AppM, Count(..), Key )

import Data.Functor ( ($>) )
import Database.SQLite.Simple
@@ -18,10 +18,20 @@ import Database.SQLite.Simple
import Control.Monad.Catch ( finally )
import Control.Monad.Reader ( ask )
import Control.Monad.IO.Class ( liftIO )
import qualified StmContainers.Map as SM
import GHC.Conc (atomically)


submitKeyHandler :: Key -> AppM ()
submitKeyHandler key = withSQLiteCon $ \con -> do
submitKeyHandler key = do
AppState{..} <- ask
liftIO $ atomically $ do
SM.lookup key stmMap >>= \case
Just v -> SM.insert (v + 1) key stmMap
Nothing -> SM.insert 1 key stmMap

{--
withSQLiteCon $ \con -> do
r <- liftIO $ withImmediateTransaction con $ do
queryNamed @Count con "SELECT count FROM keys WHERE key=:key" [":key" := key] >>= \case
[] -> executeNamed con "INSERT INTO keys (key, count) VALUES (:key, :count)" [":key" := key, ":count" := Count 1] $> Right ()
@@ -30,14 +40,16 @@ submitKeyHandler key = withSQLiteCon $ \con -> do
case r of
Right _ -> pure ()
Left e -> fail e -- internal error
--}


countKeyHandler :: Key -> AppM Count
countKeyHandler key = withSQLiteCon $ \con -> do
liftIO (queryNamed @Count con "SELECT count FROM keys WHERE key=:key" [":key" := key]) >>= \case
[] -> return (Count 0)
[c] -> pure c
_ -> fail "Oops" -- internal error
countKeyHandler key = do
AppState{..} <- ask
liftIO $ atomically $ do
SM.lookup key stmMap >>= \case
Just v -> return v
Nothing -> return (Count 0)

withSQLiteCon :: (Connection -> AppM a) -> AppM a
withSQLiteCon action = do


+ 4
- 1
lib/Soostone/Types.hs View File

@@ -17,10 +17,12 @@ import Database.SQLite.Simple.ToField ( ToField(..) )
import Servant
( Handler, ServerError(errBody), FromHttpApiData, err500 )
import Servant.API.Generic ( Generic )
import qualified StmContainers.Map as SM
import Data.Hashable


newtype Key = Key Text
deriving (FromHttpApiData, Generic)
deriving (FromHttpApiData, Generic, Hashable, Eq)

instance ToField Key where
toField (Key k) = toField k
@@ -46,6 +48,7 @@ instance FromJSON Count

data AppState = AppState {
sqliteFile :: FilePath
, stmMap :: SM.Map Key Count
}

newtype AppM a = AppM { runAppM :: ReaderT AppState Handler a }


+ 2
- 0
soostone.cabal View File

@@ -21,6 +21,7 @@ common deps
, base >=4.13 && <5.0
, bytestring ^>=0.11
, exceptions ^>=0.10
, hashable ^>=1.4
, mtl ^>=2.2
, optparse-applicative ^>=0.16
, prometheus-client ^>=1.1
@@ -29,6 +30,7 @@ common deps
, servant ^>=0.19
, servant-server ^>=0.19
, sqlite-simple ^>=0.4
, stm-containers ^>=1.2
, text ^>=2.0
, transformers ^>=0.5
, wai ^>=3.2.3


Loading…
Cancel
Save