| Safe Haskell | Safe-Inferred | 
|---|---|
| Language | Haskell2010 | 
Opaleye.Internal.PrimQuery
Documentation
data SemijoinType Source #
Instances
| Show SemijoinType Source # | |
| Defined in Opaleye.Internal.PrimQuery Methods showsPrec :: Int -> SemijoinType -> ShowS # show :: SemijoinType -> String # showList :: [SemijoinType] -> ShowS # | |
data TableIdentifier Source #
Constructors
| TableIdentifier | |
| Fields 
 | |
Instances
| Show TableIdentifier Source # | |
| Defined in Opaleye.Internal.PrimQuery Methods showsPrec :: Int -> TableIdentifier -> ShowS # show :: TableIdentifier -> String # showList :: [TableIdentifier] -> ShowS # | |
Constructors
| NonLateral | |
| Lateral | 
data PrimQuery' a Source #
Constructors
| Unit | |
| Empty a | |
| BaseTable TableIdentifier (Bindings PrimExpr) | |
| Product (NonEmpty (Lateral, PrimQuery' a)) [PrimExpr] | |
| Aggregate (Bindings (Maybe (AggrOp, [OrderExpr], AggrDistinct), Symbol)) (PrimQuery' a) | The subqueries to take the product of and the restrictions to apply | 
| DistinctOnOrderBy (Maybe (NonEmpty PrimExpr)) [OrderExpr] (PrimQuery' a) | Represents both  | 
| Limit LimitOp (PrimQuery' a) | |
| Join JoinType PrimExpr (Bindings PrimExpr) (Bindings PrimExpr) (PrimQuery' a) (PrimQuery' a) | |
| Semijoin SemijoinType (PrimQuery' a) (PrimQuery' a) | |
| Exists Symbol (PrimQuery' a) | |
| Values [Symbol] (NonEmpty [PrimExpr]) | |
| Binary BinOp (PrimQuery' a, PrimQuery' a) | |
| Label String (PrimQuery' a) | |
| RelExpr PrimExpr (Bindings PrimExpr) | |
| Rebind Bool (Bindings PrimExpr) (PrimQuery' a) | |
| ForUpdate (PrimQuery' a) | 
Instances
| Show a => Show (PrimQuery' a) Source # | |
| Defined in Opaleye.Internal.PrimQuery Methods showsPrec :: Int -> PrimQuery' a -> ShowS # show :: PrimQuery' a -> String # showList :: [PrimQuery' a] -> ShowS # | |
type PrimQuery = PrimQuery' () Source #
type PrimQueryFold = PrimQueryFold' () Source #
data PrimQueryFold' a p Source #
Constructors
| PrimQueryFold | |
| Fields 
 | |
primQueryFoldDefault :: PrimQueryFold' a (PrimQuery' a) Source #
foldPrimQuery :: PrimQueryFold' a p -> PrimQuery' a -> p Source #
isUnit :: PrimQuery' a -> Bool Source #