queryparser-0.1.0.1: Analysis and parsing library for SQL queries.
Database.Sql.Position
data Position Source #
Constructors
Fields
Instances
Methods
(==) :: Position -> Position -> Bool #
(/=) :: Position -> Position -> Bool #
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 #
compare :: Position -> Position -> Ordering #
(<) :: Position -> Position -> Bool #
(<=) :: Position -> Position -> Bool #
(>) :: Position -> Position -> Bool #
(>=) :: Position -> Position -> Bool #
max :: Position -> Position -> Position #
min :: Position -> Position -> Position #
showsPrec :: Int -> Position -> ShowS #
show :: Position -> String #
showList :: [Position] -> ShowS #
Associated Types
type Rep Position :: * -> * #
from :: Position -> Rep Position x #
to :: Rep Position x -> Position #
toJSON :: Position -> Value #
toEncoding :: Position -> Encoding #
toJSONList :: [Position] -> Value #
toEncodingList :: [Position] -> Encoding #
parseJSON :: Value -> Parser Position #
parseJSONList :: Value -> Parser [Position] #
data Range Source #
(==) :: Range -> Range -> Bool #
(/=) :: Range -> Range -> Bool #
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 #
compare :: Range -> Range -> Ordering #
(<) :: Range -> Range -> Bool #
(<=) :: Range -> Range -> Bool #
(>) :: Range -> Range -> Bool #
(>=) :: Range -> Range -> Bool #
max :: Range -> Range -> Range #
min :: Range -> Range -> Range #
showsPrec :: Int -> Range -> ShowS #
show :: Range -> String #
showList :: [Range] -> ShowS #
type Rep Range :: * -> * #
from :: Range -> Rep Range x #
to :: Rep Range x -> Range #
(<>) :: Range -> Range -> Range #
sconcat :: NonEmpty Range -> Range #
stimes :: Integral b => b -> Range -> Range #
toJSON :: Range -> Value #
toEncoding :: Range -> Encoding #
toJSONList :: [Range] -> Value #
toEncodingList :: [Range] -> Encoding #
parseJSON :: Value -> Parser Range #
parseJSONList :: Value -> Parser [Range] #
type EvalResult e (Expr ResolvedNames Range) :: * Source #
eval :: Proxy * e -> Expr ResolvedNames Range -> EvalResult e (Expr ResolvedNames Range) Source #
type EvalResult e (Selection ResolvedNames Range) :: * Source #
eval :: Proxy * e -> Selection ResolvedNames Range -> EvalResult e (Selection ResolvedNames Range) Source #
type EvalResult e (SelectTimeseries ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectTimeseries ResolvedNames Range -> EvalResult e (SelectTimeseries ResolvedNames Range) Source #
type EvalResult e (SelectHaving ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectHaving ResolvedNames Range -> EvalResult e (SelectHaving ResolvedNames Range) Source #
type EvalResult e (SelectGroup ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectGroup ResolvedNames Range -> EvalResult e (SelectGroup ResolvedNames Range) Source #
type EvalResult e (SelectWhere ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectWhere ResolvedNames Range -> EvalResult e (SelectWhere 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.
type EvalResult e (SelectColumns ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectColumns ResolvedNames Range -> EvalResult e (SelectColumns ResolvedNames Range) Source #
type EvalResult e (JoinCondition ResolvedNames Range) :: * Source #
eval :: Proxy * e -> JoinCondition ResolvedNames Range -> EvalResult e (JoinCondition ResolvedNames Range) Source #
type EvalResult e (Tablish ResolvedNames Range) :: * Source #
eval :: Proxy * e -> Tablish ResolvedNames Range -> EvalResult e (Tablish ResolvedNames Range) Source #
type EvalResult e (SelectFrom ResolvedNames Range) :: * Source #
eval :: Proxy * e -> SelectFrom ResolvedNames Range -> EvalResult e (SelectFrom ResolvedNames Range) Source #
type EvalResult e (Select ResolvedNames Range) :: * Source #
eval :: Proxy * e -> Select ResolvedNames Range -> EvalResult e (Select ResolvedNames Range) Source #
type EvalResult e (Query ResolvedNames Range) :: * Source #
eval :: Proxy * e -> Query ResolvedNames Range -> EvalResult e (Query ResolvedNames Range) Source #
getColumnLineage :: Statement d ResolvedNames Range -> (RecordSet ColumnLineage, ColumnLineagePlus) Source #
(?<>) :: Semigroup a => a -> Maybe a -> a infixr 6 Source #
advanceHorizontal :: Int64 -> Position -> Position Source #
advanceVertical :: Int64 -> Position -> Position Source #
advance :: Text -> Position -> Position Source #