Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Documentation
data SemijoinType Source #
Instances
Show SemijoinType Source # | |
Defined in Opaleye.Internal.PrimQuery showsPrec :: Int -> SemijoinType -> ShowS # show :: SemijoinType -> String # showList :: [SemijoinType] -> ShowS # |
data TableIdentifier Source #
Instances
Show TableIdentifier Source # | |
Defined in Opaleye.Internal.PrimQuery showsPrec :: Int -> TableIdentifier -> ShowS # show :: TableIdentifier -> String # showList :: [TableIdentifier] -> ShowS # |
data PrimQuery' a Source #
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 (Lateral, PrimQuery' a) (Lateral, 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 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 #
PrimQueryFold | |
|
primQueryFoldDefault :: PrimQueryFold' a (PrimQuery' a) Source #
foldPrimQuery :: PrimQueryFold' a p -> PrimQuery' a -> p Source #
isUnit :: PrimQuery' a -> Bool Source #