2016-03-06 13:44:56 +03:00
|
|
|
module Main where
|
|
|
|
|
|
|
|
import Rebase.Prelude
|
|
|
|
import qualified Hasql.Connection
|
2018-05-23 13:33:34 +03:00
|
|
|
import qualified Hasql.Statement
|
2016-03-06 13:44:56 +03:00
|
|
|
import qualified Hasql.Encoders
|
|
|
|
import qualified Hasql.Decoders
|
|
|
|
import qualified Hasql.Session
|
2018-05-23 13:33:34 +03:00
|
|
|
import qualified Main.Statements as Statements
|
2016-03-06 13:44:56 +03:00
|
|
|
|
|
|
|
|
|
|
|
main =
|
|
|
|
acquire >>= use
|
|
|
|
where
|
|
|
|
acquire =
|
|
|
|
(,) <$> acquire <*> acquire
|
|
|
|
where
|
|
|
|
acquire =
|
|
|
|
join $
|
|
|
|
fmap (either (fail . show) return) $
|
|
|
|
Hasql.Connection.acquire connectionSettings
|
|
|
|
where
|
|
|
|
connectionSettings =
|
|
|
|
Hasql.Connection.settings "localhost" 5432 "postgres" "" "postgres"
|
|
|
|
use (connection1, connection2) =
|
|
|
|
do
|
|
|
|
beginVar <- newEmptyMVar
|
|
|
|
finishVar <- newEmptyMVar
|
|
|
|
forkIO $ do
|
|
|
|
traceM "1: in"
|
|
|
|
putMVar beginVar ()
|
2018-05-23 13:33:34 +03:00
|
|
|
session connection1 (Hasql.Session.statement 0.2 Statements.selectSleep)
|
2016-03-06 13:44:56 +03:00
|
|
|
traceM "1: out"
|
|
|
|
void (tryPutMVar finishVar False)
|
|
|
|
forkIO $ do
|
|
|
|
takeMVar beginVar
|
|
|
|
traceM "2: in"
|
2018-05-23 13:33:34 +03:00
|
|
|
session connection2 (Hasql.Session.statement 0.1 Statements.selectSleep)
|
2016-03-06 13:44:56 +03:00
|
|
|
traceM "2: out"
|
|
|
|
void (tryPutMVar finishVar True)
|
|
|
|
bool exitFailure exitSuccess . traceShowId =<< takeMVar finishVar
|
|
|
|
where
|
|
|
|
session connection session =
|
|
|
|
Hasql.Session.run session connection >>=
|
|
|
|
either (fail . show) return
|