Safe Haskell | None |
---|---|
Language | Haskell2010 |
Parameter substitution for the Untyped SQL AST.
Synopsis
- numberAntiquotes :: Word -> Statement -> (Statement, AntiquoteState)
- numberAntiquotesExpr :: Expr -> State AntiquoteState Expr
- data AntiquoteState = AntiquoteState {
- paramCount :: Word
- haskellExpressions :: [Text]
- initialAntiquoteState :: AntiquoteState
- maxParam :: Statement -> Word
- maxParamExpr :: Expr -> Word
Documentation
numberAntiquotes :: Word -> Statement -> (Statement, AntiquoteState) Source #
data AntiquoteState Source #
Instances
Eq AntiquoteState Source # | |
Defined in Preql.QuasiQuoter.Syntax.Params (==) :: AntiquoteState -> AntiquoteState -> Bool # (/=) :: AntiquoteState -> AntiquoteState -> Bool # | |
Ord AntiquoteState Source # | |
Defined in Preql.QuasiQuoter.Syntax.Params compare :: AntiquoteState -> AntiquoteState -> Ordering # (<) :: AntiquoteState -> AntiquoteState -> Bool # (<=) :: AntiquoteState -> AntiquoteState -> Bool # (>) :: AntiquoteState -> AntiquoteState -> Bool # (>=) :: AntiquoteState -> AntiquoteState -> Bool # max :: AntiquoteState -> AntiquoteState -> AntiquoteState # min :: AntiquoteState -> AntiquoteState -> AntiquoteState # | |
Show AntiquoteState Source # | |
Defined in Preql.QuasiQuoter.Syntax.Params showsPrec :: Int -> AntiquoteState -> ShowS # show :: AntiquoteState -> String # showList :: [AntiquoteState] -> ShowS # |
maxParamExpr :: Expr -> Word Source #