queryparser-0.1.0.1: Analysis and parsing library for SQL queries.

Safe HaskellNone
LanguageHaskell2010

Database.Sql.Position

Documentation

data Position Source #

Instances

Eq Position Source # 
Data Position Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Position -> c Position #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Position #

toConstr :: Position -> Constr #

dataTypeOf :: Position -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Position) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Position) #

gmapT :: (forall b. Data b => b -> b) -> Position -> Position #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Position -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Position -> r #

gmapQ :: (forall d. Data d => d -> u) -> Position -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Position -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Position -> m Position #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Position -> m Position #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Position -> m Position #

Ord Position Source # 
Show Position Source # 
Generic Position Source # 

Associated Types

type Rep Position :: * -> * #

Methods

from :: Position -> Rep Position x #

to :: Rep Position x -> Position #

ToJSON Position Source # 
FromJSON Position Source # 
type Rep Position Source # 
type Rep Position = D1 * (MetaData "Position" "Database.Sql.Position" "queryparser-0.1.0.1-L3r1ujeH5Ss7CLthXKM008" False) (C1 * (MetaCons "Position" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "positionLine") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int64)) ((:*:) * (S1 * (MetaSel (Just Symbol "positionColumn") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int64)) (S1 * (MetaSel (Just Symbol "positionOffset") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int64)))))

data Range Source #

Constructors

Range 

Fields

Instances

Eq Range Source # 

Methods

(==) :: Range -> Range -> Bool #

(/=) :: Range -> Range -> Bool #

Data Range Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Range -> c Range #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Range #

toConstr :: Range -> Constr #

dataTypeOf :: Range -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Range) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Range) #

gmapT :: (forall b. Data b => b -> b) -> Range -> Range #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Range -> r #

gmapQ :: (forall d. Data d => d -> u) -> Range -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Range -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Range -> m Range #

Ord Range Source # 

Methods

compare :: Range -> Range -> Ordering #

(<) :: Range -> Range -> Bool #

(<=) :: Range -> Range -> Bool #

(>) :: Range -> Range -> Bool #

(>=) :: Range -> Range -> Bool #

max :: Range -> Range -> Range #

min :: Range -> Range -> Range #

Show Range Source # 

Methods

showsPrec :: Int -> Range -> ShowS #

show :: Range -> String #

showList :: [Range] -> ShowS #

Generic Range Source # 

Associated Types

type Rep Range :: * -> * #

Methods

from :: Range -> Rep Range x #

to :: Rep Range x -> Range #

Semigroup Range Source # 

Methods

(<>) :: Range -> Range -> Range #

sconcat :: NonEmpty Range -> Range #

stimes :: Integral b => b -> Range -> Range #

ToJSON Range Source # 
FromJSON Range Source # 
Evaluation e => Evaluate e (Expr ResolvedNames Range) Source # 
Evaluation e => Evaluate e (Selection ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectTimeseries ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectHaving ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectGroup ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectWhere ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectColumns ResolvedNames Range) Source #

SelectColumns tells us how to map from the records provided by the FROM to (unfiltered, &c) records provided by our select. Evaluating it gives us that function.

Evaluation e => Evaluate e (JoinCondition ResolvedNames Range) Source # 
Evaluation e => Evaluate e (Tablish ResolvedNames Range) Source # 
Evaluation e => Evaluate e (SelectFrom ResolvedNames Range) Source # 
Evaluation e => Evaluate e (Select ResolvedNames Range) Source # 
Evaluation e => Evaluate e (Query ResolvedNames Range) Source # 
HasColumnLineage (Statement d ResolvedNames Range) Source # 
type Rep Range Source # 
type Rep Range = D1 * (MetaData "Range" "Database.Sql.Position" "queryparser-0.1.0.1-L3r1ujeH5Ss7CLthXKM008" False) (C1 * (MetaCons "Range" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "start") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Position)) (S1 * (MetaSel (Just Symbol "end") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Position))))
type EvalResult e (Expr ResolvedNames Range) Source # 
type EvalResult e (Selection ResolvedNames Range) Source # 
type EvalResult e (SelectTimeseries ResolvedNames Range) Source # 
type EvalResult e (SelectHaving ResolvedNames Range) Source # 
type EvalResult e (SelectGroup ResolvedNames Range) Source # 
type EvalResult e (SelectWhere ResolvedNames Range) Source # 
type EvalResult e (SelectColumns ResolvedNames Range) Source # 
type EvalResult e (JoinCondition ResolvedNames Range) Source # 
type EvalResult e (Tablish ResolvedNames Range) Source # 
type EvalResult e (SelectFrom ResolvedNames Range) Source # 
type EvalResult e (Select ResolvedNames Range) Source # 
type EvalResult e (Query ResolvedNames Range) Source # 

(?<>) :: Semigroup a => a -> Maybe a -> a infixr 6 Source #