aeson-jsonpath
Copyright(c) 2024-2025 Taimoor Zaeem
LicenseMIT
MaintainerTaimoor Zaeem <[email protected]>
StabilityExperimental
PortabilityPortable
Safe HaskellSafe-Inferred
LanguageHaskell2010

Data.Aeson.JSONPath.Query.Types

Description

This module contains the data structures.

Synopsis

Documentation

data Query Source #

 

Constructors

Query 

Instances

Instances details
Queryable Query Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query

Show Query Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

showsPrec :: Int -> Query -> ShowS #

show :: Query -> String #

showList :: [Query] -> ShowS #

Eq Query Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

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

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

Lift Query Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => Query -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Query -> Code m Query #

data QueryType Source #

 

Constructors

Root 
Current 

Instances

Instances details
Show QueryType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq QueryType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Lift QueryType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => QueryType -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => QueryType -> Code m QueryType #

data Segment Source #

 

Instances

Instances details
Queryable Segment Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query

Show Segment Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq Segment Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

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

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

Lift Segment Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => Segment -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Segment -> Code m Segment #

data SegmentType Source #

 

Constructors

Child 
Descendant 

Instances

Instances details
Show SegmentType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq SegmentType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Lift SegmentType Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => SegmentType -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => SegmentType -> Code m SegmentType #

data Selector Source #

 

Instances

Instances details
Queryable Selector Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query

Show Selector Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq Selector Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Lift Selector Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => Selector -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => Selector -> Code m Selector #

newtype LogicalOrExpr Source #

 

Constructors

LogicalOr [LogicalAndExpr] 

Instances

Instances details
Show LogicalOrExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq LogicalOrExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Lift LogicalOrExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => LogicalOrExpr -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => LogicalOrExpr -> Code m LogicalOrExpr #

data BasicExpr Source #

 

Instances

Instances details
Show BasicExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Eq BasicExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Lift BasicExpr Source # 
Instance details

Defined in Data.Aeson.JSONPath.Query.Types

Methods

lift :: Quote m => BasicExpr -> m Exp #

liftTyped :: forall (m :: Type -> Type). Quote m => BasicExpr -> Code m BasicExpr #