module Data.HashMap.Strict.InsOrd (
InsOrdHashMap,
empty,
singleton,
null,
size,
member,
lookup,
lookupDefault,
insert,
insertWith,
delete,
adjust,
update,
alter,
union,
unionWith,
unionWithKey,
unions,
map,
mapKeys,
traverseKeys,
mapWithKey,
traverseWithKey,
unorderedTraverse,
unorderedTraverseWithKey,
difference,
intersection,
intersectionWith,
intersectionWithKey,
foldl',
foldlWithKey',
foldr,
foldrWithKey,
foldMapWithKey,
unorderedFoldMap,
unorderedFoldMapWithKey,
filter,
filterWithKey,
mapMaybe,
mapMaybeWithKey,
keys,
elems,
toList,
toRevList,
fromList,
toHashMap,
fromHashMap,
hashMap,
unorderedTraversal,
valid,
) where
#ifndef MIN_VERSION_aeson
#define MIN_VERSION_aeson(x,y,z) 0
#endif
import Prelude ()
import Prelude.Compat hiding (filter, foldr, lookup, map, null)
import Control.Applicative (Const (..), (<**>))
import Control.Arrow (first, second)
import Data.Aeson
import qualified Data.Aeson.Encoding as E
import Data.Data (Data, Typeable)
import qualified Data.Foldable as F
import Data.Functor.Apply (Apply (..))
import Data.Functor.Bind (Bind (..))
import Data.Hashable (Hashable (..))
import Data.List (nub, sortBy)
import Data.Maybe (fromMaybe)
import Data.Ord (comparing)
import Data.Semigroup (Semigroup (..))
import Text.ParserCombinators.ReadPrec (prec)
import Text.Read (Lexeme (..), Read (..), lexP,
parens, readListPrecDefault)
import Control.Lens (At (..), FoldableWithIndex (..),
FunctorWithIndex (..), Index, Iso, IxValue,
Ixed (..), TraversableWithIndex (..),
Traversal, iso, (<&>), _1, _2)
import Control.Monad.Trans.State.Strict (State, runState, state)
import Data.HashMap.Strict (HashMap)
import qualified Data.HashMap.Strict as HashMap
#if MIN_VERSION_base(4,7,0)
import qualified GHC.Exts as Exts
#endif
data P a = P !Int !a
deriving (Functor, Foldable, Traversable, Typeable, Data)
getPK :: P a -> Int
getPK (P i _) = i
getPV :: P a -> a
getPV (P _ a) = a
incPK :: Int -> P a -> P a
incPK i (P j x) = P (i + j) x
instance Eq a => Eq (P a) where
P _ a == P _ b = a == b
instance Show a => Show (P a) where
showsPrec d (P _ x) = showsPrec d x
instance Hashable a => Hashable (P a) where
hashWithSalt salt (P _ x) = hashWithSalt salt x
data InsOrdHashMap k v = InsOrdHashMap
{ _getIndex :: !Int
, getInsOrdHashMap :: !(HashMap k (P v))
}
deriving (Functor, Typeable, Data)
instance (Eq k, Eq v) => Eq (InsOrdHashMap k v) where
InsOrdHashMap _ a == InsOrdHashMap _ b = a == b
instance (Show k, Show v) => Show (InsOrdHashMap k v) where
showsPrec d m = showParen (d > 10) $
showString "fromList " . showsPrec 11 (toList m)
instance (Eq k, Hashable k, Read k, Read v) => Read (InsOrdHashMap k v) where
readPrec = parens $ prec 10 $ do
Ident "fromList" <- lexP
xs <- readPrec
return (fromList xs)
readListPrec = readListPrecDefault
instance (Eq k, Hashable k) => Semigroup (InsOrdHashMap k v) where
(<>) = union
instance (Eq k, Hashable k) => Monoid (InsOrdHashMap k v) where
mempty = empty
mappend = union
instance Foldable (InsOrdHashMap k) where
foldMap f = foldMap (f . snd) . toList
#if MIN_VERSION_base(4,8,0)
null = null
toList = elems
length = size
#endif
instance Traversable (InsOrdHashMap k) where
traverse f m = traverseWithKey (\_ -> f) m
instance (Eq k, Hashable k) => Apply (InsOrdHashMap k) where
(<.>) = intersectionWith id
(<. ) = intersectionWith const
( .>) = intersectionWith (const id)
instance (Eq k, Hashable k) => Bind (InsOrdHashMap k) where
m >>- f = mapMaybeWithKey (\k -> lookup k . f) m
instance (Hashable k, Hashable v) => Hashable (InsOrdHashMap k v) where
hashWithSalt salt (InsOrdHashMap _ m) =
hashWithSalt salt m
#if MIN_VERSION_base(4,7,0)
instance (Eq k, Hashable k) => Exts.IsList (InsOrdHashMap k v) where
type Item (InsOrdHashMap k v) = (k, v)
fromList = fromList
toList = toList
#endif
instance (ToJSONKey k) => ToJSON1 (InsOrdHashMap k) where
liftToJSON t _ = case toJSONKey :: ToJSONKeyFunction k of
ToJSONKeyText f _ -> object . fmap (\(k, v) -> (f k, t v)) . toList
ToJSONKeyValue f _ -> toJSON . fmap (\(k,v) -> toJSON (f k, t v)) . toList
liftToEncoding t _ = case toJSONKey :: ToJSONKeyFunction k of
ToJSONKeyText _ f -> E.dict f t foldrWithKey
ToJSONKeyValue _ f -> E.list (liftToEncoding2 f (E.list f) t (E.list t)) . toList
instance (ToJSONKey k, ToJSON v) => ToJSON (InsOrdHashMap k v) where
toJSON = toJSON1
toEncoding = toEncoding1
instance (Eq k, Hashable k, FromJSONKey k) => FromJSON1 (InsOrdHashMap k) where
liftParseJSON p pl v = fromList . HashMap.toList <$> liftParseJSON p pl v
instance (Eq k, Hashable k, FromJSONKey k, FromJSON v) => FromJSON (InsOrdHashMap k v) where
parseJSON = parseJSON1
type instance Index (InsOrdHashMap k v) = k
type instance IxValue (InsOrdHashMap k v) = v
instance (Eq k, Hashable k) => Ixed (InsOrdHashMap k v) where
ix k f m = case lookup k m of
Just v -> f v <&> \v' -> insert k v' m
Nothing -> pure m
instance (Eq k, Hashable k) => At (InsOrdHashMap k a) where
at k f m = f mv <&> \r -> case r of
Nothing -> maybe m (const (delete k m)) mv
Just v' -> insert k v' m
where mv = lookup k m
instance (Eq k, Hashable k) => FunctorWithIndex k (InsOrdHashMap k) where
imap = mapWithKey
instance (Eq k, Hashable k) => FoldableWithIndex k (InsOrdHashMap k) where
ifoldMap = foldMapWithKey
instance (Eq k, Hashable k) => TraversableWithIndex k (InsOrdHashMap k) where
itraverse = traverseWithKey
hashMap :: Iso (InsOrdHashMap k a) (InsOrdHashMap k b) (HashMap k a) (HashMap k b)
hashMap = iso toHashMap fromHashMap
unorderedTraversal :: Traversal (InsOrdHashMap k a) (InsOrdHashMap k b) a b
unorderedTraversal = hashMap . traverse
empty :: InsOrdHashMap k v
empty = InsOrdHashMap 0 HashMap.empty
singleton :: Hashable k => k -> v -> InsOrdHashMap k v
singleton k v = InsOrdHashMap 1 (HashMap.singleton k (P 0 v))
null :: InsOrdHashMap k v -> Bool
null = HashMap.null . getInsOrdHashMap
size :: InsOrdHashMap k v -> Int
size = HashMap.size . getInsOrdHashMap
member :: (Eq k, Hashable k) => k -> InsOrdHashMap k a -> Bool
member k = HashMap.member k . getInsOrdHashMap
lookup :: (Eq k, Hashable k) => k -> InsOrdHashMap k v -> Maybe v
lookup k = fmap getPV . HashMap.lookup k . getInsOrdHashMap
lookupDefault
:: (Eq k, Hashable k)
=> v
-> k -> InsOrdHashMap k v -> v
lookupDefault def k m = fromMaybe def $ lookup k m
delete :: (Eq k, Hashable k) => k -> InsOrdHashMap k v -> InsOrdHashMap k v
delete k (InsOrdHashMap i m) = InsOrdHashMap i $ HashMap.delete k m
insert :: (Eq k, Hashable k) => k -> v -> InsOrdHashMap k v -> InsOrdHashMap k v
insert = insertWith const
insertWith
:: (Eq k, Hashable k)
=> (v -> v -> v) -> k -> v -> InsOrdHashMap k v -> InsOrdHashMap k v
insertWith f k v = alter (Just . maybe v (f v)) k
adjust
:: (Eq k, Hashable k)
=> (v -> v) -> k -> InsOrdHashMap k v -> InsOrdHashMap k v
adjust f = alter (fmap f)
update
:: (Eq k, Hashable k)
=> (a -> Maybe a) -> k -> InsOrdHashMap k a -> InsOrdHashMap k a
update f = alter (>>= f)
alter
:: (Eq k, Hashable k)
=> (Maybe v -> Maybe v) -> k -> InsOrdHashMap k v -> InsOrdHashMap k v
alter f k insm@(InsOrdHashMap j m) =
case HashMap.lookup k m of
Nothing -> case f Nothing of
Nothing -> insm
Just v -> InsOrdHashMap (j + 1) (HashMap.insert k (P j v) m)
Just (P i v) -> case f (Just v) of
Nothing -> InsOrdHashMap j (HashMap.delete k m)
Just u -> InsOrdHashMap j (HashMap.insert k (P i u) m)
unionWith
:: (Eq k, Hashable k)
=> (v -> v -> v)
-> InsOrdHashMap k v -> InsOrdHashMap k v -> InsOrdHashMap k v
unionWith f (InsOrdHashMap i a) (InsOrdHashMap j b) =
mk $ HashMap.unionWith f' a b'
where
mk | i > 0xfffff || j >= 0xfffff = fromHashMapP
| otherwise = InsOrdHashMap (i + j)
b' = fmap (incPK i) b
f' (P ii x) (P _ y) = P ii (f x y)
unionWithKey
:: (Eq k, Hashable k)
=> (k -> v -> v -> v)
-> InsOrdHashMap k v -> InsOrdHashMap k v -> InsOrdHashMap k v
unionWithKey f (InsOrdHashMap i a) (InsOrdHashMap j b) =
InsOrdHashMap (i + j) $ HashMap.unionWithKey f' a b'
where
b' = fmap (incPK i) b
f' k (P ii x) (P _ y) = P ii (f k x y)
union
:: (Eq k, Hashable k)
=> InsOrdHashMap k v -> InsOrdHashMap k v -> InsOrdHashMap k v
union = unionWith const
unions
:: (Eq k, Hashable k, Foldable f)
=> f (InsOrdHashMap k v) -> InsOrdHashMap k v
unions = F.foldl' union empty
mapKeys :: (Eq k', Hashable k') => (k -> k') -> InsOrdHashMap k v -> InsOrdHashMap k' v
mapKeys f (InsOrdHashMap i m) = InsOrdHashMap i $
HashMap.fromList . fmap (first f) . HashMap.toList $ m
traverseKeys
:: (Eq k', Hashable k', Applicative f)
=> (k -> f k') -> InsOrdHashMap k v -> f (InsOrdHashMap k' v)
traverseKeys f (InsOrdHashMap i m) = InsOrdHashMap i . HashMap.fromList <$>
(traverse . _1) f (HashMap.toList m)
map :: (v1 -> v2) -> InsOrdHashMap k v1 -> InsOrdHashMap k v2
map = fmap
mapWithKey :: (k -> v1 -> v2) -> InsOrdHashMap k v1 -> InsOrdHashMap k v2
mapWithKey f (InsOrdHashMap i m) =
InsOrdHashMap i $ HashMap.mapWithKey f' m
where
f' k (P j x) = P j (f k x)
foldMapWithKey :: Monoid m => (k -> a -> m) -> InsOrdHashMap k a -> m
foldMapWithKey f = foldMap (uncurry f) . toList
traverseWithKey :: Applicative f => (k -> a -> f b) -> InsOrdHashMap k a -> f (InsOrdHashMap k b)
traverseWithKey f (InsOrdHashMap n m) = InsOrdHashMap n <$> retractSortedAp
(HashMap.traverseWithKey (\k (P i v) -> liftSortedAp i (P i <$> f k v)) m)
data SortedAp f a where
Pure :: a -> SortedAp f a
SortedAp :: !Int -> f a -> SortedAp f (a -> b) -> SortedAp f b
instance Functor (SortedAp f) where
fmap f (Pure a) = Pure (f a)
fmap f (SortedAp i x y) = SortedAp i x ((f .) <$> y)
instance Applicative (SortedAp f) where
pure = Pure
Pure f <*> y = fmap f y
f <*> Pure y = fmap ($ y) f
f@(SortedAp i x y) <*> z@(SortedAp j u v)
| i < j = SortedAp i x (flip <$> y <*> z)
| otherwise = SortedAp j u ((.) <$> f <*> v)
liftSortedAp :: Int -> f a -> SortedAp f a
liftSortedAp i x = SortedAp i x (Pure id)
retractSortedAp :: Applicative f => SortedAp f a -> f a
retractSortedAp (Pure x) = pure x
retractSortedAp (SortedAp _ f x) = f <**> retractSortedAp x
unorderedFoldMap :: Monoid m => (a -> m) -> InsOrdHashMap k a -> m
unorderedFoldMap f (InsOrdHashMap _ m) = foldMap (f . getPV) m
unorderedFoldMapWithKey :: Monoid m => (k -> a -> m) -> InsOrdHashMap k a -> m
unorderedFoldMapWithKey f m =
getConst (unorderedTraverseWithKey (\k a -> Const (f k a)) m)
unorderedTraverse :: Applicative f => (a -> f b) -> InsOrdHashMap k a -> f (InsOrdHashMap k b)
unorderedTraverse f (InsOrdHashMap i m) =
InsOrdHashMap i <$> (traverse . traverse) f m
unorderedTraverseWithKey :: Applicative f => (k -> a -> f b) -> InsOrdHashMap k a -> f (InsOrdHashMap k b)
unorderedTraverseWithKey f (InsOrdHashMap i m) =
InsOrdHashMap i <$> HashMap.traverseWithKey f' m
where
f' k (P j x) = P j <$> f k x
difference
:: (Eq k, Hashable k)
=> InsOrdHashMap k v -> InsOrdHashMap k w -> InsOrdHashMap k v
difference (InsOrdHashMap i a) (InsOrdHashMap _ b) =
InsOrdHashMap i $ HashMap.difference a b
intersection
:: (Eq k, Hashable k)
=> InsOrdHashMap k v -> InsOrdHashMap k w -> InsOrdHashMap k v
intersection = intersectionWith const
intersectionWith
:: (Eq k, Hashable k)
=> (v1 -> v2 -> v3)
-> InsOrdHashMap k v1 -> InsOrdHashMap k v2 -> InsOrdHashMap k v3
intersectionWith f = intersectionWithKey (\_ -> f)
intersectionWithKey
:: (Eq k, Hashable k)
=> (k -> v1 -> v2 -> v3)
-> InsOrdHashMap k v1 -> InsOrdHashMap k v2 -> InsOrdHashMap k v3
intersectionWithKey f (InsOrdHashMap i a) (InsOrdHashMap _ b) =
InsOrdHashMap i $ HashMap.intersectionWithKey f' a b
where
f' k (P j x) (P _ y) = P j (f k x y)
foldl' :: (a -> v -> a) -> a -> InsOrdHashMap k v -> a
foldl' f x = F.foldl' f' x . toList
where
f' a (_, v) = f a v
foldlWithKey' :: (a -> k -> v -> a) -> a -> InsOrdHashMap k v -> a
foldlWithKey' f x = F.foldl' f' x . toList
where
f' a (k, v) = f a k v
foldr :: (v -> a -> a) -> a -> InsOrdHashMap k v -> a
foldr f x = F.foldr f' x . toList
where
f' (_, v) a = f v a
foldrWithKey :: (k -> v -> a -> a) -> a -> InsOrdHashMap k v -> a
foldrWithKey f x = F.foldr f' x . toList
where
f' (k, v) a = f k v a
filter :: (v -> Bool) -> InsOrdHashMap k v -> InsOrdHashMap k v
filter f (InsOrdHashMap i m) =
InsOrdHashMap i $ HashMap.filter (f . getPV) m
filterWithKey :: (k -> v -> Bool) -> InsOrdHashMap k v -> InsOrdHashMap k v
filterWithKey f (InsOrdHashMap i m) =
InsOrdHashMap i $ HashMap.filterWithKey f' m
where
f' k (P _ x) = f k x
mapMaybe :: (v1 -> Maybe v2) -> InsOrdHashMap k v1 -> InsOrdHashMap k v2
mapMaybe f (InsOrdHashMap i m) = InsOrdHashMap i $ HashMap.mapMaybe f' m
where
f' (P j x) = P j <$> f x
mapMaybeWithKey :: (k -> v1 -> Maybe v2) -> InsOrdHashMap k v1 -> InsOrdHashMap k v2
mapMaybeWithKey f (InsOrdHashMap i m) =
InsOrdHashMap i $ HashMap.mapMaybeWithKey f' m
where
f' k (P j x) = P j <$> f k x
keys :: InsOrdHashMap k v -> [k]
keys = fmap fst . toList
elems :: InsOrdHashMap k v -> [v]
elems = fmap snd . toList
fromList :: forall k v. (Eq k, Hashable k) => [(k, v)] -> InsOrdHashMap k v
fromList
= mk
. flip runState 0
. (traverse . _2) newP
where
mk :: ([(k, P v)], Int) -> InsOrdHashMap k v
mk (m, i) = InsOrdHashMap i (HashMap.fromList m)
toList :: InsOrdHashMap k v -> [(k, v)]
toList
= fmap (second getPV)
. sortBy (comparing (getPK . snd))
. HashMap.toList
. getInsOrdHashMap
toRevList :: InsOrdHashMap k v -> [(k, v)]
toRevList
= fmap (second getPV)
. sortBy (flip $ comparing (getPK . snd))
. HashMap.toList
. getInsOrdHashMap
fromHashMap :: HashMap k v -> InsOrdHashMap k v
fromHashMap = mk . flip runState 0 . traverse newP
where
mk (m, i) = InsOrdHashMap i m
toHashMap :: InsOrdHashMap k v -> HashMap k v
toHashMap (InsOrdHashMap _ m) = fmap getPV m
fromHashMapP :: HashMap k (P v) -> InsOrdHashMap k v
fromHashMapP = mk . flip runState 0 . retractSortedAp . traverse f
where
mk (m, i) = InsOrdHashMap i m
f (P i v) = liftSortedAp i (newP v)
valid :: InsOrdHashMap k v -> Bool
valid (InsOrdHashMap i m) = indexesDistinct && indexesSmaller
where
indexes :: [Int]
indexes = getPK <$> HashMap.elems m
indexesDistinct = indexes == nub indexes
indexesSmaller = all (< i) indexes
newP :: a -> State Int (P a)
newP x = state $ \s -> (P s x, s + 1)