module Hasql.DynamicStatements.Session where
import Hasql.Decoders qualified as Decoders
import Hasql.DynamicStatements.Prelude
import Hasql.DynamicStatements.Snippet.Defs qualified as SnippetDefs
import Hasql.DynamicStatements.Statement qualified as Statement
import Hasql.Session
import Hasql.Session qualified as Session
dynamicallyParameterizedStatement :: SnippetDefs.Snippet -> Decoders.Result result -> Bool -> Session result
dynamicallyParameterizedStatement :: forall result. Snippet -> Result result -> Bool -> Session result
dynamicallyParameterizedStatement Snippet
snippet Result result
decoder Bool
prepared =
() -> Statement () result -> Session result
forall params result.
params -> Statement params result -> Session result
Session.statement () (Snippet -> Result result -> Bool -> Statement () result
forall result.
Snippet -> Result result -> Bool -> Statement () result
Statement.dynamicallyParameterized Snippet
snippet Result result
decoder Bool
prepared)