| Safe Haskell | Safe-Inferred |
|---|---|
| Language | Haskell2010 |
Opaleye.Internal.HaskellDB.PrimQuery
Documentation
Constructors
| AttrExpr Symbol | |
| BaseTableAttrExpr Attribute | |
| CompositeExpr PrimExpr Attribute | Composite Type Query |
| BinExpr BinOp PrimExpr PrimExpr | |
| UnExpr UnOp PrimExpr | |
| AggrExpr (Aggr' PrimExpr) | |
| WndwExpr WndwOp Partition | |
| ConstExpr Literal | |
| CaseExpr [(PrimExpr, PrimExpr)] PrimExpr | |
| ListExpr (NonEmpty PrimExpr) | |
| ParamExpr (Maybe Name) PrimExpr | |
| FunExpr Name [PrimExpr] | |
| CastExpr Name PrimExpr | Cast an expression to a given type. |
| DefaultInsertExpr | |
| ArrayExpr [PrimExpr] | ARRAY[..] |
| RangeExpr String BoundExpr BoundExpr | |
| ArrayIndex PrimExpr PrimExpr |
Constructors
| NullLit | |
| DefaultLit | represents a default value |
| BoolLit Bool | |
| StringLit String | |
| ByteStringLit ByteString | |
| IntegerLit Integer | |
| DoubleLit Double | |
| NumericLit Scientific | |
| OtherLit String | used for hacking in custom SQL |
Constructors
Constructors
| AggrCount | |
| AggrSum | |
| AggrAvg | |
| AggrMin | |
| AggrMax | |
| AggrStdDev | |
| AggrStdDevP | |
| AggrVar | |
| AggrVarP | |
| AggrBoolOr | |
| AggrBoolAnd | |
| AggrArr | |
| JsonArr | |
| AggrStringAggr | |
| AggrOther String |
data AggrDistinct Source #
Constructors
| AggrDistinct | |
| AggrAll |
Instances
| Read AggrDistinct Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods readsPrec :: Int -> ReadS AggrDistinct # readList :: ReadS [AggrDistinct] # | |
| Show AggrDistinct Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods showsPrec :: Int -> AggrDistinct -> ShowS # show :: AggrDistinct -> String # showList :: [AggrDistinct] -> ShowS # | |
| Eq AggrDistinct Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery | |
type Aggregate = Aggregate' PrimExpr Source #
data Aggregate' a Source #
Instances
Constructors
| Aggr | |
Fields
| |
Instances
| Foldable Aggr' Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods fold :: Monoid m => Aggr' m -> m # foldMap :: Monoid m => (a -> m) -> Aggr' a -> m # foldMap' :: Monoid m => (a -> m) -> Aggr' a -> m # foldr :: (a -> b -> b) -> b -> Aggr' a -> b # foldr' :: (a -> b -> b) -> b -> Aggr' a -> b # foldl :: (b -> a -> b) -> b -> Aggr' a -> b # foldl' :: (b -> a -> b) -> b -> Aggr' a -> b # foldr1 :: (a -> a -> a) -> Aggr' a -> a # foldl1 :: (a -> a -> a) -> Aggr' a -> a # elem :: Eq a => a -> Aggr' a -> Bool # maximum :: Ord a => Aggr' a -> a # minimum :: Ord a => Aggr' a -> a # | |
| Traversable Aggr' Source # | |
| Functor Aggr' Source # | |
| Read a => Read (Aggr' a) Source # | |
| Show a => Show (Aggr' a) Source # | |
type OrderExpr = OrderExpr' PrimExpr Source #
data OrderExpr' a Source #
Instances
data OrderNulls Source #
Constructors
| NullsFirst | |
| NullsLast |
Instances
| Read OrderNulls Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods readsPrec :: Int -> ReadS OrderNulls # readList :: ReadS [OrderNulls] # readPrec :: ReadPrec OrderNulls # readListPrec :: ReadPrec [OrderNulls] # | |
| Show OrderNulls Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods showsPrec :: Int -> OrderNulls -> ShowS # show :: OrderNulls -> String # showList :: [OrderNulls] -> ShowS # | |
data OrderDirection Source #
Instances
| Read OrderDirection Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods readsPrec :: Int -> ReadS OrderDirection # readList :: ReadS [OrderDirection] # | |
| Show OrderDirection Source # | |
Defined in Opaleye.Internal.HaskellDB.PrimQuery Methods showsPrec :: Int -> OrderDirection -> ShowS # show :: OrderDirection -> String # showList :: [OrderDirection] -> ShowS # | |
Constructors
| Inclusive PrimExpr | |
| Exclusive PrimExpr | |
| PosInfinity | |
| NegInfinity |
Constructors