| Maintainer | pfrance@gmail.com |
|---|---|
| Safe Haskell | None |
| Language | Haskell2010 |
Data.Geometry.Geos.STRTree
Description
A query-only R-tree created using the Sort-Tile-Recursive (STR) algorithm. For two-dimensional spatial data.
The STR packed R-tree is simple to implement and maximizes space utilization; that is, as many leaves as possible are filled to capacity. Overlap between nodes is far less than in a basic R-tree. However, once the tree has been built (explicitly or on the first call to query), items may not be added or removed.
Described in: P. Rigaux, Michel Scholl and Agnes Voisard. Spatial Databases With Application To GIS. Morgan Kaufmann, San Francisco, 2002.
Synopsis
- foldr :: Storable a => (a -> b -> b) -> b -> STRTree a -> b
- toList :: Storable a => STRTree a -> [a]
- toVector :: Storable a => STRTree a -> Vector a
- fromList :: Storable b => [(Geometry a, b)] -> STRTree b
- empty :: STRTreeBuilder a
- build :: STRTreeBuilder a -> STRTree a
- insert :: Storable a => Geometry b -> a -> STRTreeBuilder a -> ()
- fromFoldable :: (Foldable f, Storable b) => f (Geometry a, b) -> STRTree b
- fromFoldable_ :: (Foldable f, Storable b) => Int -> f (Geometry a, b) -> STRTree b
- lookup :: Storable b => Geometry a -> STRTree b -> Vector b
- data STRTree a
- data STRTreeBuilder a
Documentation
empty :: STRTreeBuilder a Source #
build :: STRTreeBuilder a -> STRTree a Source #
fromFoldable :: (Foldable f, Storable b) => f (Geometry a, b) -> STRTree b Source #
fromFoldable creates an STRTree with a default node capacity of 10. For finer-grained control over the node capacity, fromFoldable_ accepts a node-capacity argument.
lookup :: Storable b => Geometry a -> STRTree b -> Vector b Source #
Queries the index for all items whose extents intersect the given search Envelope. Note that some kinds of indexes may also return objects which do not in fact intersect the query envelope.
data STRTreeBuilder a Source #
A mutable data structure. Must build into an STRTree before querying.
Instances
| Eq (STRTreeBuilder a) Source # | |
Defined in Data.Geometry.Geos.Raw.STRTree Methods (==) :: STRTreeBuilder a -> STRTreeBuilder a -> Bool # (/=) :: STRTreeBuilder a -> STRTreeBuilder a -> Bool # | |
| Show (STRTreeBuilder a) Source # | |
Defined in Data.Geometry.Geos.Raw.STRTree Methods showsPrec :: Int -> STRTreeBuilder a -> ShowS # show :: STRTreeBuilder a -> String # showList :: [STRTreeBuilder a] -> ShowS # | |