mirror of
https://github.com/nikita-volkov/hasql.git
synced 2024-11-25 06:33:19 +03:00
Progress
This commit is contained in:
parent
b587235bc6
commit
f96af01f08
@ -7,18 +7,38 @@ import Prelude
|
|||||||
|
|
||||||
spec :: Spec
|
spec :: Spec
|
||||||
spec = do
|
spec = do
|
||||||
|
describe "Single-statement" do
|
||||||
|
describe "Unprepared" do
|
||||||
|
it "Collects results and sends params" do
|
||||||
|
result <-
|
||||||
|
Dsl.runPipelineOnLocalDb
|
||||||
|
$ GenerateSeries.pipeline False GenerateSeries.Params {start = 0, end = 2}
|
||||||
|
shouldBe result (Right [0 .. 2])
|
||||||
|
|
||||||
|
describe "Prepared and sends params" do
|
||||||
|
fit "Collects results and sends params" do
|
||||||
|
result <-
|
||||||
|
Dsl.runPipelineOnLocalDb
|
||||||
|
$ GenerateSeries.pipeline True GenerateSeries.Params {start = 0, end = 2}
|
||||||
|
shouldBe result (Right [0 .. 2])
|
||||||
|
|
||||||
describe "Normally" do
|
describe "Normally" do
|
||||||
describe "On prepared statements" do
|
describe "On prepared statements" do
|
||||||
it "Collects results" do
|
it "Collects results and sends params" do
|
||||||
_result <-
|
result <-
|
||||||
Dsl.runPipelineOnLocalDb
|
Dsl.runPipelineOnLocalDb
|
||||||
$ (,)
|
$ replicateM 2
|
||||||
<$> GenerateSeries.pipeline True GenerateSeries.Params {start = 0, end = 1000}
|
$ GenerateSeries.pipeline True GenerateSeries.Params {start = 0, end = 2}
|
||||||
<*> GenerateSeries.pipeline True GenerateSeries.Params {start = 0, end = 1000}
|
shouldBe result (Right [[0 .. 2], [0 .. 2]])
|
||||||
pending
|
|
||||||
describe "On unprepared statements" do
|
describe "On unprepared statements" do
|
||||||
it "Works" do
|
it "Collects results and sends params" do
|
||||||
pending
|
result <-
|
||||||
|
Dsl.runPipelineOnLocalDb
|
||||||
|
$ replicateM 2
|
||||||
|
$ GenerateSeries.pipeline False GenerateSeries.Params {start = 0, end = 2}
|
||||||
|
shouldBe result (Right [[0 .. 2], [0 .. 2]])
|
||||||
|
|
||||||
describe "When some part fails" do
|
describe "When some part fails" do
|
||||||
it "Works" do
|
it "Works" do
|
||||||
pending
|
pending
|
||||||
|
@ -21,9 +21,9 @@ newtype Results a
|
|||||||
deriving (Functor, Applicative, Monad)
|
deriving (Functor, Applicative, Monad)
|
||||||
|
|
||||||
{-# INLINE run #-}
|
{-# INLINE run #-}
|
||||||
run :: Results a -> (Bool, LibPQ.Connection) -> IO (Either CommandError a)
|
run :: Results a -> LibPQ.Connection -> Bool -> IO (Either CommandError a)
|
||||||
run (Results stack) env =
|
run (Results stack) conn idt =
|
||||||
runExceptT (runReaderT stack env)
|
runExceptT (runReaderT stack (idt, conn))
|
||||||
|
|
||||||
{-# INLINE clientError #-}
|
{-# INLINE clientError #-}
|
||||||
clientError :: Results a
|
clientError :: Results a
|
||||||
@ -87,8 +87,8 @@ dropRemainders =
|
|||||||
ExceptT $ fmap (mapLeft ResultError) $ Result.run Result.noResult (integerDatetimes, result)
|
ExceptT $ fmap (mapLeft ResultError) $ Result.run Result.noResult (integerDatetimes, result)
|
||||||
|
|
||||||
refine :: (a -> Either Text b) -> Results a -> Results b
|
refine :: (a -> Either Text b) -> Results a -> Results b
|
||||||
refine refiner results = Results
|
refine refiner (Results stack) = Results
|
||||||
$ ReaderT
|
$ ReaderT
|
||||||
$ \env -> ExceptT $ do
|
$ \env -> ExceptT $ do
|
||||||
resultEither <- run results env
|
resultEither <- runExceptT $ runReaderT stack env
|
||||||
return $ resultEither >>= mapLeft (ResultError . UnexpectedResult) . refiner
|
return $ resultEither >>= mapLeft (ResultError . UnexpectedResult) . refiner
|
||||||
|
@ -62,9 +62,9 @@ getResults connection integerDatetimes decoder =
|
|||||||
(<*) <$> get <*> dropRemainders
|
(<*) <$> get <*> dropRemainders
|
||||||
where
|
where
|
||||||
get =
|
get =
|
||||||
ResultsDecoders.run decoder (integerDatetimes, connection)
|
ResultsDecoders.run decoder connection integerDatetimes
|
||||||
dropRemainders =
|
dropRemainders =
|
||||||
ResultsDecoders.run ResultsDecoders.dropRemainders (integerDatetimes, connection)
|
ResultsDecoders.run ResultsDecoders.dropRemainders connection integerDatetimes
|
||||||
|
|
||||||
{-# INLINE getPreparedStatementKey #-}
|
{-# INLINE getPreparedStatementKey #-}
|
||||||
getPreparedStatementKey ::
|
getPreparedStatementKey ::
|
||||||
@ -85,12 +85,12 @@ getPreparedStatementKey connection registry template oidList =
|
|||||||
onNewRemoteKey key =
|
onNewRemoteKey key =
|
||||||
do
|
do
|
||||||
sent <- LibPQ.sendPrepare connection key template (mfilter (not . null) (Just oidList))
|
sent <- LibPQ.sendPrepare connection key template (mfilter (not . null) (Just oidList))
|
||||||
let resultsDecoder =
|
fmap resultsMapping $ getResults connection undefined (resultsDecoder sent)
|
||||||
if sent
|
|
||||||
then ResultsDecoders.single ResultDecoders.noResult
|
|
||||||
else ResultsDecoders.clientError
|
|
||||||
fmap resultsMapping $ getResults connection undefined resultsDecoder
|
|
||||||
where
|
where
|
||||||
|
resultsDecoder sent =
|
||||||
|
if sent
|
||||||
|
then ResultsDecoders.single ResultDecoders.noResult
|
||||||
|
else ResultsDecoders.clientError
|
||||||
resultsMapping =
|
resultsMapping =
|
||||||
\case
|
\case
|
||||||
Left x -> (False, Left x)
|
Left x -> (False, Left x)
|
||||||
|
@ -3,6 +3,7 @@ module Hasql.Pipeline.Core where
|
|||||||
import Database.PostgreSQL.LibPQ qualified as Pq
|
import Database.PostgreSQL.LibPQ qualified as Pq
|
||||||
import Hasql.Connection.Core qualified as Connection
|
import Hasql.Connection.Core qualified as Connection
|
||||||
import Hasql.Decoders.All qualified as Decoders
|
import Hasql.Decoders.All qualified as Decoders
|
||||||
|
import Hasql.Decoders.Results qualified as Decoders.Results
|
||||||
import Hasql.Encoders.All qualified as Encoders
|
import Hasql.Encoders.All qualified as Encoders
|
||||||
import Hasql.Encoders.Params qualified as Encoders.Params
|
import Hasql.Encoders.Params qualified as Encoders.Params
|
||||||
import Hasql.Errors
|
import Hasql.Errors
|
||||||
@ -10,16 +11,33 @@ import Hasql.IO qualified as IO
|
|||||||
import Hasql.Prelude
|
import Hasql.Prelude
|
||||||
import Hasql.PreparedStatementRegistry qualified as PreparedStatementRegistry
|
import Hasql.PreparedStatementRegistry qualified as PreparedStatementRegistry
|
||||||
import Hasql.Statement qualified as Statement
|
import Hasql.Statement qualified as Statement
|
||||||
|
import System.IO (BufferMode (NoBuffering), hSetBuffering, stdout)
|
||||||
|
|
||||||
run :: Pipeline a -> Connection.Connection -> IO (Either QueryError a)
|
run :: Pipeline a -> Connection.Connection -> IO (Either QueryError a)
|
||||||
run (Pipeline send recv) (Connection.Connection pqConnectionRef integerDatetimes registry) =
|
run (Pipeline send recv) (Connection.Connection pqConnectionRef integerDatetimes registry) = do
|
||||||
|
hSetBuffering stdout NoBuffering
|
||||||
withMVar pqConnectionRef \pqConnection -> do
|
withMVar pqConnectionRef \pqConnection -> do
|
||||||
Pq.enterPipelineMode pqConnection
|
putStrLn "enterPipelineMode"
|
||||||
|
runCommandFailing pqConnection $ Pq.enterPipelineMode pqConnection
|
||||||
|
putStrLn "send"
|
||||||
sendResult <- send pqConnection integerDatetimes registry
|
sendResult <- send pqConnection integerDatetimes registry
|
||||||
Pq.pipelineSync pqConnection
|
putStrLn "pipelineSync"
|
||||||
|
runCommandFailing pqConnection $ Pq.pipelineSync pqConnection
|
||||||
|
putStrLn "recv"
|
||||||
recvResult <- recv pqConnection integerDatetimes
|
recvResult <- recv pqConnection integerDatetimes
|
||||||
Pq.exitPipelineMode pqConnection
|
putStrLn "exitPipelineMode"
|
||||||
|
handleEither =<< Decoders.Results.run Decoders.Results.dropRemainders pqConnection integerDatetimes
|
||||||
|
putStrLn "exitPipelineMode"
|
||||||
|
runCommandFailing pqConnection $ Pq.exitPipelineMode pqConnection
|
||||||
|
putStrLn "return"
|
||||||
pure (sendResult *> recvResult)
|
pure (sendResult *> recvResult)
|
||||||
|
where
|
||||||
|
runCommandFailing :: Pq.Connection -> IO Bool -> IO ()
|
||||||
|
runCommandFailing pqConn runCmd =
|
||||||
|
IO.checkedSend pqConn runCmd >>= handleEither
|
||||||
|
handleEither = \case
|
||||||
|
Right a -> pure a
|
||||||
|
Left err -> fail $ show err
|
||||||
|
|
||||||
data Pipeline a
|
data Pipeline a
|
||||||
= Pipeline
|
= Pipeline
|
||||||
@ -60,6 +78,7 @@ statement params (Statement.Statement template (Encoders.Params paramsEncoder) (
|
|||||||
|
|
||||||
recv pqConnection integerDatetimes =
|
recv pqConnection integerDatetimes =
|
||||||
mapLeft commandToQueryError
|
mapLeft commandToQueryError
|
||||||
|
-- <$> Decoders.Results.run decoder (integerDatetimes, pqConnection)
|
||||||
<$> IO.getResults pqConnection integerDatetimes decoder
|
<$> IO.getResults pqConnection integerDatetimes decoder
|
||||||
|
|
||||||
commandToQueryError =
|
commandToQueryError =
|
||||||
|
@ -12,7 +12,7 @@ data Params = Params
|
|||||||
end :: Int64
|
end :: Int64
|
||||||
}
|
}
|
||||||
|
|
||||||
type Result = Vector Int64
|
type Result = [Int64]
|
||||||
|
|
||||||
session :: Bool -> Params -> Session.Session Result
|
session :: Bool -> Params -> Session.Session Result
|
||||||
session prepared params =
|
session prepared params =
|
||||||
@ -39,6 +39,6 @@ encoder =
|
|||||||
|
|
||||||
decoder :: Decoders.Result Result
|
decoder :: Decoders.Result Result
|
||||||
decoder =
|
decoder =
|
||||||
Decoders.rowVector
|
Decoders.rowList
|
||||||
( Decoders.column (Decoders.nonNullable Decoders.int8)
|
( Decoders.column (Decoders.nonNullable Decoders.int8)
|
||||||
)
|
)
|
||||||
|
Loading…
Reference in New Issue
Block a user