Safe Haskell | None |
---|
An efficient implementation of queryable sets.
Assume you have a type like:
data Entry = Entry Author [Author] Updated Id Content newtype Updated = Updated EpochTime newtype Id = Id Int64 newtype Content = Content String newtype Author = Author Email type Email = String
- Decide what parts of your type you want indexed and make your type
an instance of
Indexable
. UseixFun
andixGen
to build indexes:
instance Indexable Entry where empty = ixSet [ ixGen (Proxy :: Proxy Author) -- out of order , ixGen (Proxy :: Proxy Id) , ixGen (Proxy :: Proxy Updated) , ixGen (Proxy :: Proxy Test) -- bogus index ]
entries = foldr insert empty [e1,e2,e3,e4] entries' = foldr delete entries [e1,e3] entries'' = update e4 e5 entries
- Use the query functions below to grab data from it:
entries @= (Author "john@doe.com") @< (Updated t1)
Statement above will find all items in entries updated earlier than
t1
by john@doe.com
.
- Text index
If you want to do add a text index create a calculated index. Then if you want
all entries with either word1
or word2
, you change the instance
to:
getWords (Entry _ _ _ _ (Content s)) = map Word $ words s instance Indexable Entry where empty = ixSet [ ... ixFun getWords ]
Now you can do this query to find entries with any of the words:
entries @+ [Word "word1", Word "word2"]
And if you want all entries with both:
entries @* [Word "word1", Word "word2"]
- Find only the first author
If an Entry
has multiple authors and you want to be able to query on
the first author only, define a FirstAuthor
datatype and create an
index with this type. Now you can do:
newtype FirstAuthor = FirstAuthor Email getFirstAuthor (Entry author _ _ _ _) = [FirstAuthor author] instance Indexable Entry where ... empty = ixSet [ ... ixFun getFirstAuthor ] entries @= (FirstAuthor "john@doe.com") -- guess what this does
- data IxSet a
- class Indexable a where
- data Proxy a = Proxy
- noCalcs :: t -> ()
- inferIxSet :: String -> Name -> Name -> [Name] -> Q [Dec]
- ixSet :: [Ix a] -> IxSet a
- ixFun :: forall a b. (Ord b, Typeable b) => (a -> [b]) -> Ix a
- ixGen :: forall a b. (Data a, Ord b, Typeable b) => Proxy b -> Ix a
- type IndexOp = forall k a. (Ord k, Ord a) => k -> a -> Map k (Set a) -> Map k (Set a)
- change :: (Typeable a, Indexable a, Ord a) => IndexOp -> a -> IxSet a -> IxSet a
- insert :: (Typeable a, Ord a, Indexable a) => a -> IxSet a -> IxSet a
- delete :: (Typeable a, Ord a, Indexable a) => a -> IxSet a -> IxSet a
- updateIx :: (Indexable a, Ord a, Typeable a, Typeable k) => k -> a -> IxSet a -> IxSet a
- deleteIx :: (Indexable a, Ord a, Typeable a, Typeable k) => k -> IxSet a -> IxSet a
- fromSet :: (Indexable a, Ord a, Typeable a) => Set a -> IxSet a
- fromList :: (Indexable a, Ord a, Typeable a) => [a] -> IxSet a
- toSet :: Ord a => IxSet a -> Set a
- toList :: Ord a => IxSet a -> [a]
- toAscList :: forall k a. (Indexable a, Typeable a, Typeable k) => Proxy k -> IxSet a -> [a]
- toDescList :: forall k a. (Indexable a, Typeable a, Typeable k) => Proxy k -> IxSet a -> [a]
- getOne :: Ord a => IxSet a -> Maybe a
- getOneOr :: Ord a => a -> IxSet a -> a
- size :: Ord a => IxSet a -> Int
- null :: IxSet a -> Bool
- (&&&) :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet a
- (|||) :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet a
- union :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet a
- intersection :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet a
- (@=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet a
- (@<) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet a
- (@>) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet a
- (@<=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet a
- (@>=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet a
- (@><) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet a
- (@>=<) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet a
- (@><=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet a
- (@>=<=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet a
- (@+) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> [k] -> IxSet a
- (@*) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> [k] -> IxSet a
- getEQ :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet a
- getLT :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet a
- getGT :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet a
- getLTE :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet a
- getGTE :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet a
- getRange :: (Indexable a, Typeable k, Ord a, Typeable a) => k -> k -> IxSet a -> IxSet a
- groupBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]
- groupAscBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]
- groupDescBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]
- flatten :: (Typeable a, Data a, Typeable b) => a -> [b]
- flattenWithCalcs :: (Data c, Typeable a, Data a, Typeable b) => (a -> c) -> a -> [b]
- stats :: Ord a => IxSet a -> (Int, Int, Int, Int)
Set type
Set with associated indexes.
Typeable1 IxSet | |
(Data ctx a, Data ctx [a], Sat (ctx (IxSet a)), Sat (ctx [a]), Indexable a, Data a, Ord a) => Data ctx (IxSet a) | |
(Eq a, Ord a, Typeable a) => Eq (IxSet a) | |
Data a => Data (IxSet a) | |
(Eq a, Ord a, Typeable a) => Ord (IxSet a) | |
(Ord a, Read a, Typeable a, Indexable a) => Read (IxSet a) | |
(Ord a, Show a) => Show (IxSet a) | |
(Indexable a, Typeable a, Ord a) => Monoid (IxSet a) | |
(SafeCopy a, Ord a, Typeable a, Indexable a) => SafeCopy (IxSet a) |
Defines objects that can be members of IxSet
.
Function to be used for calcs
in inferIxSet
when you don't
want any calculated values.
inferIxSet :: String -> Name -> Name -> [Name] -> Q [Dec]Source
Template Haskell helper function for automatically building an
Indexable
instance from a data type, e.g.
data Foo = Foo Int String
and
$(inferIxSet "FooDB" ''Foo 'noCalcs [''Int,''String])
will build a type synonym
type FooDB = IxSet Foo
with Int
and String
as indexes.
WARNING: The type specified as the first index must be a type which
appears in all values in the IxSet
or toList
, toSet
and
serialization will not function properly. You will be warned not to do
this with a runtime error. You can always use the element type
itself. For example:
$(inferIxSet "FooDB" ''Foo 'noCalcs [''Foo, ''Int, ''String])
ixSet :: [Ix a] -> IxSet aSource
Create an IxSet
using a list of indexes. Useful in the Indexable
empty
method. Use ixFun
and ixGen
as list elements.
instance Indexable Type where empty = ixSet [ ... ixFun getIndex1 ixGen (Proxy :: Proxy Index2Type) ]
Every value in the IxSet
must be reachable by the first index in this
list, or you'll get a runtime error.
ixFun :: forall a b. (Ord b, Typeable b) => (a -> [b]) -> Ix aSource
Create a functional index. Provided function should return a list of indexes where the value should be found.
getIndexes value = [...indexes...]
instance Indexable Type where empty = ixSet [ ixFun getIndexes ]
This is the recommended way to create indexes.
ixGen :: forall a b. (Data a, Ord b, Typeable b) => Proxy b -> Ix aSource
Create a generic index. Provided example is used only as type source
so you may use a Proxy
. This uses flatten to traverse values using
their Data
instances.
instance Indexable Type where empty = ixSet [ ixGen (Proxy :: Proxy Type) ]
In production systems consider using ixFun
in place of ixGen
as
the former one is much faster.
Changes to set
delete :: (Typeable a, Ord a, Indexable a) => a -> IxSet a -> IxSet aSource
Removes an item from the IxSet
.
Creation
Conversion
toAscList :: forall k a. (Indexable a, Typeable a, Typeable k) => Proxy k -> IxSet a -> [a]Source
Converts an IxSet
to its list of elements.
List will be sorted in ascending order by the index k
.
The list may contain duplicate entries if a single value produces multiple keys.
toDescList :: forall k a. (Indexable a, Typeable a, Typeable k) => Proxy k -> IxSet a -> [a]Source
Converts an IxSet
to its list of elements.
List will be sorted in descending order by the index k
.
The list may contain duplicate entries if a single value produces multiple keys.
Size checking
Set operations
(&&&) :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet aSource
An infix intersection
operation.
(|||) :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet aSource
An infix union
operation.
union :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet aSource
Takes the union of the two IxSet
s.
intersection :: (Ord a, Typeable a, Indexable a) => IxSet a -> IxSet a -> IxSet aSource
Takes the intersection of the two IxSet
s.
Indexing
(@=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet aSource
Infix version of getEQ
.
(@<) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet aSource
Infix version of getLT
.
(@>) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet aSource
Infix version of getGT
.
(@<=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet aSource
Infix version of getLTE
.
(@>=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> k -> IxSet aSource
Infix version of getGTE
.
(@><) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet aSource
Returns the subset with indexes in the open interval (k,k).
(@>=<) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet aSource
Returns the subset with indexes in [k,k).
(@><=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet aSource
Returns the subset with indexes in (k,k].
(@>=<=) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> (k, k) -> IxSet aSource
Returns the subset with indexes in [k,k].
(@+) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> [k] -> IxSet aSource
Creates the subset that has an index in the provided list.
(@*) :: (Indexable a, Typeable a, Ord a, Typeable k) => IxSet a -> [k] -> IxSet aSource
Creates the subset that matches all the provided indexes.
getEQ :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet aSource
Returns the subset with an index equal to the provided key. The set must be indexed over key type, doing otherwise results in runtime error.
getLT :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet aSource
Returns the subset with an index less than the provided key. The set must be indexed over key type, doing otherwise results in runtime error.
getGT :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet aSource
Returns the subset with an index greater than the provided key. The set must be indexed over key type, doing otherwise results in runtime error.
getLTE :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet aSource
Returns the subset with an index less than or equal to the provided key. The set must be indexed over key type, doing otherwise results in runtime error.
getGTE :: (Indexable a, Typeable a, Ord a, Typeable k) => k -> IxSet a -> IxSet aSource
Returns the subset with an index greater than or equal to the provided key. The set must be indexed over key type, doing otherwise results in runtime error.
getRange :: (Indexable a, Typeable k, Ord a, Typeable a) => k -> k -> IxSet a -> IxSet aSource
Returns the subset with an index within the interval provided. The bottom of the interval is closed and the top is open, i. e. [k1;k2). The set must be indexed over key type, doing otherwise results in runtime error.
groupBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]Source
Returns lists of elements paired with the indexes determined by type inference.
groupAscBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]Source
Returns lists of elements paired with the indexes determined by type inference.
The resulting list will be sorted in ascending order by k
.
The values in '[t]' will be sorted in ascending order as well.
groupDescBy :: (Typeable k, Typeable t) => IxSet t -> [(k, [t])]Source
Returns lists of elements paired with the indexes determined by type inference.
The resulting list will be sorted in descending order by k
.
NOTE: The values in '[t]' are currently sorted in ascending
order. But this may change if someone bothers to add
toDescList
. So do not rely on the sort order of '[t]'.
Index creation helpers
Debugging and optimization
stats :: Ord a => IxSet a -> (Int, Int, Int, Int)Source
Statistics about IxSet
. This function returns quadruple
consisting of 1. total number of elements in the set 2. number of
declared indexes 3. number of keys in all indexes 4. number of
values in all keys in all indexes. This can aid you in debugging
and optimisation.