haskell-postgis-0.2.0: A haskell library for PostGIS geometry types.

Safe HaskellNone
LanguageHaskell2010

Database.Postgis

Documentation

data Geometry Source #

Instances
Eq Geometry Source # 
Instance details

Defined in Database.Postgis.Geometry

Data Geometry Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: Geometry -> Constr #

dataTypeOf :: Geometry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Geometry Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON Geometry Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON Geometry Source # 
Instance details

Defined in Database.Postgis.JSON

newtype MultiPolygon Source #

Constructors

MultiPolygon (Vector Polygon) 
Instances
Eq MultiPolygon Source # 
Instance details

Defined in Database.Postgis.Geometry

Data MultiPolygon Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: MultiPolygon -> Constr #

dataTypeOf :: MultiPolygon -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MultiPolygon Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON MultiPolygon Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON MultiPolygon Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry MultiPolygon Source # 
Instance details

Defined in Database.Postgis.Geometry

newtype MultiLineString Source #

Instances
Eq MultiLineString Source # 
Instance details

Defined in Database.Postgis.Geometry

Data MultiLineString Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: MultiLineString -> Constr #

dataTypeOf :: MultiLineString -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MultiLineString Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON MultiLineString Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON MultiLineString Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry MultiLineString Source # 
Instance details

Defined in Database.Postgis.Geometry

newtype MultiPoint Source #

Constructors

MultiPoint (Vector Position) 
Instances
Eq MultiPoint Source # 
Instance details

Defined in Database.Postgis.Geometry

Data MultiPoint Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: MultiPoint -> Constr #

dataTypeOf :: MultiPoint -> DataType #

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

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

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

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

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

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

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

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

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

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

Show MultiPoint Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON MultiPoint Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON MultiPoint Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry MultiPoint Source # 
Instance details

Defined in Database.Postgis.Geometry

newtype Polygon Source #

Constructors

Polygon (Vector LinearRing) 
Instances
Eq Polygon Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

Data Polygon Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: Polygon -> Constr #

dataTypeOf :: Polygon -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Polygon Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON Polygon Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON Polygon Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry Polygon Source # 
Instance details

Defined in Database.Postgis.Geometry

newtype LineString Source #

Constructors

LineString (Vector Position) 
Instances
Eq LineString Source # 
Instance details

Defined in Database.Postgis.Geometry

Data LineString Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: LineString -> Constr #

dataTypeOf :: LineString -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LineString Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON LineString Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON LineString Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry LineString Source # 
Instance details

Defined in Database.Postgis.Geometry

newtype Point Source #

Constructors

Point Position 
Instances
Eq Point Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

Data Point Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

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

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

toConstr :: Point -> Constr #

dataTypeOf :: Point -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Point Source # 
Instance details

Defined in Database.Postgis.Geometry

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String #

showList :: [Point] -> ShowS #

ToJSON Point Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON Point Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry Point Source # 
Instance details

Defined in Database.Postgis.Geometry

data Position Source #

Constructors

Position 

Fields

Instances
Eq Position Source # 
Instance details

Defined in Database.Postgis.Geometry

Data Position Source # 
Instance details

Defined in Database.Postgis.Geometry

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 #

Show Position Source # 
Instance details

Defined in Database.Postgis.Geometry

ToJSON Position Source # 
Instance details

Defined in Database.Postgis.JSON

FromJSON Position Source # 
Instance details

Defined in Database.Postgis.JSON

EWKBGeometry Position Source # 
Instance details

Defined in Database.Postgis.Geometry