Safe Haskell | None |
---|---|
Language | Haskell98 |
Building RQL queries in Haskell
- data ReQL = ReQL {}
- op :: (Arr a, Obj o) => TermType -> a -> o -> ReQL
- data BaseReQL = BaseReQL {
- termType :: TermType
- termDatum :: Maybe Datum
- termArgs :: BaseArray
- termOptArgs :: [BaseAttribute]
- data BaseAttribute = BaseAttribute Text BaseReQL
- buildQuery :: ReQL -> Int64 -> Database -> (Query, BaseReQL)
- type BaseArray = [BaseReQL]
- type Backtrace = [Frame]
- convertBacktrace :: Backtrace -> Backtrace
- class Expr e where
- data QuerySettings = QuerySettings {}
- newVarId :: State QuerySettings Int
- str :: String -> ReQL
- num :: Double -> ReQL
- data Attribute = forall e . Expr e => Text := e
- cons :: Expr e => e -> Array -> Array
- arr :: Arr a => a -> Array
- baseArray :: Array -> State QuerySettings BaseArray
- withQuerySettings :: (QuerySettings -> ReQL) -> ReQL
- data Object = Object {}
- class Obj o where
- returnVals :: ReQL -> ReQL
- nonAtomic :: ReQL -> ReQL
- canReturnVals :: ReQL -> ReQL
- canNonAtomic :: ReQL -> ReQL
- reqlToProtobuf :: ReQL -> Query
- data Bound a
- closedOrOpen :: Bound a -> Text
Documentation
An RQL term
BaseReQL | |
|
Convert other types into ReqL expressions
Expr Bool | |
Expr Double | |
Expr Int | |
Expr Int64 | |
Expr Integer | |
Expr Rational | |
Expr () | |
Expr Text | |
Expr UTCTime | |
Expr Value | |
Expr ZonedTime | |
Expr Datum | |
Expr Table | |
Expr Database | |
Expr Object | |
Expr BaseReQL | |
Expr ReQL | |
Expr ZonedTime | |
Expr UTCTime | |
Expr a => Expr [a] | |
Expr x => Expr (Vector x) | |
((~) * a ReQL, (~) * b ReQL) => Expr (a -> b -> ReQL) | |
(~) * a ReQL => Expr (a -> ReQL) | |
(Expr a, Expr b) => Expr (a, b) | |
Expr e => Expr (HashMap Text e) | |
(Expr a, Expr b, Expr c) => Expr (a, b, c) | |
(Expr a, Expr b, Expr c, Expr d) => Expr (a, b, c, d) | |
(Expr a, Expr b, Expr c, Expr d, Expr e) => Expr (a, b, c, d, e) |
data QuerySettings Source
A shortcut for inserting strings into ReQL expressions Useful when OverloadedStrings makes the type ambiguous
A key/value pair used for building objects
baseArray :: Array -> State QuerySettings BaseArray Source
withQuerySettings :: (QuerySettings -> ReQL) -> ReQL Source
A list of key/value pairs
Convert into a ReQL object
returnVals :: ReQL -> ReQL Source
Include the value of single write operations in the returned object
canReturnVals :: ReQL -> ReQL Source
canNonAtomic :: ReQL -> ReQL Source
reqlToProtobuf :: ReQL -> Query Source
An upper or lower bound for between and during
closedOrOpen :: Bound a -> Text Source