indexation-0.8: Tools for entity indexation

Safe HaskellNone
LanguageHaskell2010

Indexation.Potoki.Transform

Synopsis

Documentation

data Transform input output #

newtype Index entity Source #

Constructors

Index Int 
Instances
Vector Vector (Maybe (Index a)) # 
Instance details

Defined in Indexation.Instances

Vector Vector (Index a) # 
Instance details

Defined in Indexation.Instances

MVector MVector (Maybe (Index a)) # 
Instance details

Defined in Indexation.Instances

MVector MVector (Index a) # 
Instance details

Defined in Indexation.Instances

Eq (Index a) # 
Instance details

Defined in Indexation.Instances

Methods

(==) :: Index a -> Index a -> Bool #

(/=) :: Index a -> Index a -> Bool #

Ord (Index a) # 
Instance details

Defined in Indexation.Instances

Methods

compare :: Index a -> Index a -> Ordering #

(<) :: Index a -> Index a -> Bool #

(<=) :: Index a -> Index a -> Bool #

(>) :: Index a -> Index a -> Bool #

(>=) :: Index a -> Index a -> Bool #

max :: Index a -> Index a -> Index a #

min :: Index a -> Index a -> Index a #

Show (Index a) # 
Instance details

Defined in Indexation.Instances

Methods

showsPrec :: Int -> Index a -> ShowS #

show :: Index a -> String #

showList :: [Index a] -> ShowS #

Generic (Index a) # 
Instance details

Defined in Indexation.Instances

Associated Types

type Rep (Index a) :: * -> * #

Methods

from :: Index a -> Rep (Index a) x #

to :: Rep (Index a) x -> Index a #

Unbox (Maybe (Index a)) # 
Instance details

Defined in Indexation.Instances

Unbox (Index a) # 
Instance details

Defined in Indexation.Instances

Serialize (Index a) # 
Instance details

Defined in Indexation.Instances.Cereal

Methods

put :: Putter (Index a) #

get :: Get (Index a) #

NFData (Index a) # 
Instance details

Defined in Indexation.Instances

Methods

rnf :: Index a -> () #

Hashable (Index a) # 
Instance details

Defined in Indexation.Instances

Methods

hashWithSalt :: Int -> Index a -> Int #

hash :: Index a -> Int #

data MVector s (Index a) # 
Instance details

Defined in Indexation.Instances

data MVector s (Index a) = MV_Index (MVector s Int)
data MVector s (Maybe (Index a)) # 
Instance details

Defined in Indexation.Instances

data MVector s (Maybe (Index a)) = MV_MaybeIndex (MVector s (Bit, Index a))
type Rep (Index a) # 
Instance details

Defined in Indexation.Instances

type Rep (Index a) = D1 (MetaData "Index" "Indexation.Types" "indexation-0.8-1dMieAKnF9T9Y4wUpUAmK5" True) (C1 (MetaCons "Index" PrefixI False) (S1 (MetaSel (Nothing :: Maybe Symbol) NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 Int)))
data Vector (Maybe (Index a)) # 
Instance details

Defined in Indexation.Instances

data Vector (Index a) # 
Instance details

Defined in Indexation.Instances

data Indexer entity Source #

data EntityTable entity Source #

Instances
Serialize entity => Serialize (EntityTable entity) # 
Instance details

Defined in Indexation.Instances.Cereal

Methods

put :: Putter (EntityTable entity) #

get :: Get (EntityTable entity) #

data ReindexTable entity Source #

Map from old to new indices.

index :: (Eq entity, Hashable entity) => Indexer entity -> Transform entity (Index entity) Source #

reindex :: ReindexTable entity -> Transform (Index entity) (Index entity) Source #

lookup :: EntityTable entity -> Transform (Index entity) (Maybe entity) Source #