-- | Functions on 'AssocList's that make use of an 'Eq' constraint
-- on the type of the keys.

module Data.AssocList.List.Eq
    (

    -- * Related modules
    -- $relatedModules

    -- * Lookup
      lookupFirst
    , lookupAll

    -- * Removal
    , removeFirst
    , removeAll

    -- * Mapping
    -- $mapping
    , mapFirst
    , mapAll

    -- * Alteration
    -- $alteration
    , alterFirst
    , alterAll

    -- * Grouping
    , partition
    , break
    , breakPartition

    -- * Operators
    , (!)
    , (!?)

    ) where

import Data.AssocList.List.Concept

-- base
import Control.Exception (throw)
import qualified Data.List
import Data.Maybe (maybeToList)
import Prelude (Eq (..), Maybe (..), error, otherwise, (++), (<$>))

-- $setup
-- >>> import Prelude (fmap, map, negate, take)

-- $relatedModules
-- Some other modules that are a lot like this one:
--
-- * "Data.AssocList.List.Equivalence" - Functions on 'AssocList's
--   that involve 'Equivalence's on the keys
-- * "Data.AssocList.List.Predicate" - Functions on 'AssocList's
--   that involve 'Predicate's on the keys

-- | Obtain the first value associated with a particular key.
--
-- >>> [('A',1), ('B',2), ('B',3), ('C',4)] ! 'B'
-- 2
--
-- This function is to be used only when the key must be known to
-- be present in the mapping. If @x@ is not mapped by any entry in
-- @AssocList@ @l@, then @l '!' x@ throws 'MissingAssocListKey'.
-- The exclamation mark is intended as a reminder of this danger.
--
-- >>> [('A', 1), ('B', 2), ('B', 3), ('C', 4)] ! 'D'
-- *** Exception: MissingAssocListKey
--
-- There is a related operator called '!?' which maps the
-- missing-key condition to 'Nothing' instead.

(!) :: Eq a => AssocList a b -> a -> b
[] ! :: AssocList a b -> a -> b
! a
key                           = MissingAssocListKey -> b
forall a e. Exception e => e -> a
throw MissingAssocListKey
MissingAssocListKey
((a
x, b
y) : AssocList a b
xys) ! a
key
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 = b
y
        | Bool
otherwise                = AssocList a b
xys AssocList a b -> a -> b
forall a b. Eq a => AssocList a b -> a -> b
! a
key

-- | Obtain the first value associated with a particular key, if such
-- a mapping is present.
--
-- >>> [('A',1), ('B',2), ('B',3), ('C',4)] !? 'B'
-- Just 2
--
-- The result is 'Nothing' if the key is not mapped by any entry in
-- the list.
--
-- >>> [('A',1), ('B',2), ('B',3), ('C',4)] !? 'D'
-- Nothing
--
-- This function is the same as 'lookupFirst' but for the order of
-- its arguments.

(!?) :: Eq a => AssocList a b -> a -> Maybe b
AssocList a b
l !? :: AssocList a b -> a -> Maybe b
!? a
key = a -> AssocList a b -> Maybe b
forall a b. Eq a => a -> AssocList a b -> Maybe b
lookupFirst a
key AssocList a b
l

-- | Obtain the first value associated with a particular key, if such
-- a mapping is present.
--
-- >>> lookupFirst 'B' [('A',1), ('B',2), ('B',3), ('C',4)]
-- Just 2
--
-- The result is 'Nothing' if the key is not mapped by any entry in
-- the list.
--
-- >>> lookupFirst 'D' [('A',1), ('B',2), ('B',3), ('C',4)]
-- Nothing
--
-- This function is the same as '!?' but for the order of its
-- arguments.

lookupFirst :: Eq a => a -> AssocList a b -> Maybe b
lookupFirst :: a -> AssocList a b -> Maybe b
lookupFirst a
_key []                =  Maybe b
forall a. Maybe a
Nothing
lookupFirst a
key ((a
x, b
y) : AssocList a b
xys)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 =  b -> Maybe b
forall a. a -> Maybe a
Just b
y
        | Bool
otherwise                =  a -> AssocList a b -> Maybe b
forall a b. Eq a => a -> AssocList a b -> Maybe b
lookupFirst a
key AssocList a b
xys

-- | Obtain all values associated with a particular key, in the
-- order in which the mappings appear in the list.
--
-- >>> lookupAll 'B' [('A',1), ('B',2), ('B',3), ('C',4), ('B',3)]
-- [2,3,3]

lookupAll :: Eq a => a -> AssocList a b -> [b]
lookupAll :: a -> AssocList a b -> [b]
lookupAll a
_key []                  =  []
lookupAll a
key ((a
x, b
y) : AssocList a b
xys)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 =  b
y b -> [b] -> [b]
forall a. a -> [a] -> [a]
: a -> AssocList a b -> [b]
forall a b. Eq a => a -> AssocList a b -> [b]
lookupAll a
key AssocList a b
xys
        | Bool
otherwise                =      a -> AssocList a b -> [b]
forall a b. Eq a => a -> AssocList a b -> [b]
lookupAll a
key AssocList a b
xys

-- | Produce a modified version of the association list in which the
-- first occurrence of a particular key has been removed.
--
-- >>> removeFirst 'B' [('A',1), ('B',2), ('B',3), ('C',4)]
-- [('A',1),('B',3),('C',4)]
--
-- If the key is not present in the mapping, then the original list
-- is returned.
--
-- >>> removeFirst 'C' [('A',1), ('B',2), ('B',3)]
-- [('A',1),('B',2),('B',3)]

removeFirst :: Eq a => a -> AssocList a b -> AssocList a b
removeFirst :: a -> AssocList a b -> AssocList a b
removeFirst a
_key l :: AssocList a b
l@[]              =  AssocList a b
l
removeFirst a
key (xy :: (a, b)
xy@(a
x, b
y) : AssocList a b
xys)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 =  AssocList a b
xys
        | Bool
otherwise                =  (a, b)
xy (a, b) -> AssocList a b -> AssocList a b
forall a. a -> [a] -> [a]
: a -> AssocList a b -> AssocList a b
forall a b. Eq a => a -> AssocList a b -> AssocList a b
removeFirst a
key AssocList a b
xys

-- | Produce a modified version of the association list in which all
-- occurrences of a particular key have been removed.
--
-- >>> removeAll 'B' [('A',1), ('B',2), ('B',3), ('C',4)]
-- [('A',1),('C',4)]
--
-- If the key is not present in the mapping, then the original list
-- is returned.
--
-- >>> removeAll 'C' [('A',1), ('B',2), ('B',3)]
-- [('A',1),('B',2),('B',3)]

removeAll :: Eq a => a -> AssocList a b -> AssocList a b
removeAll :: a -> AssocList a b -> AssocList a b
removeAll a
_key l :: AssocList a b
l@[]                =  AssocList a b
l
removeAll a
key (xy :: (a, b)
xy@(a
x, b
y) : AssocList a b
xys)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 =       a -> AssocList a b -> AssocList a b
forall a b. Eq a => a -> AssocList a b -> AssocList a b
removeAll a
key AssocList a b
xys
        | Bool
otherwise                =  (a, b)
xy (a, b) -> AssocList a b -> AssocList a b
forall a. a -> [a] -> [a]
: a -> AssocList a b -> AssocList a b
forall a b. Eq a => a -> AssocList a b -> AssocList a b
removeAll a
key AssocList a b
xys

-- | Produces a tuple of two results:
--
-- 1. All values associated with a particular key
-- 2. All of the other key-value pairs
--
-- @'partition' x l = ('lookupAll' x l, 'removeAll' x l)@
--
-- >>> partition 'B' [('A',1), ('B',2), ('B',3), ('C',4), ('B',3)]
-- ([2,3,3],[('A',1),('C',4)])

partition :: Eq a => a -> AssocList a b -> ([b], AssocList a b)
partition :: a -> AssocList a b -> ([b], AssocList a b)
partition a
_key l :: AssocList a b
l@[]                = ([], AssocList a b
l)
partition a
key (xy :: (a, b)
xy@(a
x, b
y) : AssocList a b
xys)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x                 = (b
y b -> [b] -> [b]
forall a. a -> [a] -> [a]
: [b]
yes ,      AssocList a b
no)
        | Bool
otherwise                = (    [b]
yes , (a, b)
xy (a, b) -> AssocList a b -> AssocList a b
forall a. a -> [a] -> [a]
: AssocList a b
no)
    where
        ([b]
yes, AssocList a b
no) = a -> AssocList a b -> ([b], AssocList a b)
forall a b. Eq a => a -> AssocList a b -> ([b], AssocList a b)
partition a
key AssocList a b
xys

-- | Produces a tuple of two results:
--
-- 1. The longest prefix of the association list that does /not/ contain
--    a particular key
-- 2. The remainder of the list
--
-- >>> break 'B' [('A',1), ('B',2), ('B',3), ('C',4)]
-- ([('A',1)],[('B',2),('B',3),('C',4)])
--
-- If the first mapping in the list contains the given key, then the first
-- part of the resulting tuple is empty, and the second part of the result
-- is the entire list.
--
-- >>> break 'A' [('A',1), ('B',2), ('B',3), ('C',4)]
-- ([],[('A',1),('B',2),('B',3),('C',4)])
--
-- If the key is not present in the list, then the first part of the
-- resulting tuple is the entire list, and the second part of the result
-- is empty.
--
-- >>> break 'D' [('A',1), ('B',2), ('B',3), ('C',4)]
-- ([('A',1),('B',2),('B',3),('C',4)],[])

break :: Eq a => a -> AssocList a b -> (AssocList a b, AssocList a b)
break :: a -> AssocList a b -> (AssocList a b, AssocList a b)
break a
key = ((a, b) -> Bool) -> AssocList a b -> (AssocList a b, AssocList a b)
forall a. (a -> Bool) -> [a] -> ([a], [a])
Data.List.break (\(a
x, b
y) -> a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x)

-- | 'break' on a key, then 'partition' the remainder.
--
-- @'breakPartition' key l@ separates @l@ into three parts:
--
-- 1. The key-value pairs for which the key is /not/ @key@ that
--    occur in the list /before/ the first occurrence of @key@
--    (@fst ('break' key l)@)
-- 2. All values associated with @key@ (@'lookupAll' key l@)
-- 3. The key-value pairs for which the key is /not/ @key@ that
--    occur in the list /after/ the first occurrence of @key@
--    (@'removeAll' key (snd ('break' key l))@)
--
-- >>> breakPartition 'B' [('A',1),('B',2),('C',3),('B',4)]
-- ([('A',1)],[2,4],[('C',3)])
--
-- If the key is not present in the list, then the first part of the
-- result is the entire list, and the other parts are empty.
--
-- >>> breakPartition 'D' [('A',1),('B',2),('C',3),('B',4)]
-- ([('A',1),('B',2),('C',3),('B',4)],[],[])

breakPartition :: Eq a => a -> AssocList a b
    -> (AssocList a b, [b], AssocList a b)
breakPartition :: a -> AssocList a b -> (AssocList a b, [b], AssocList a b)
breakPartition a
key AssocList a b
l =
    let
        (AssocList a b
before, AssocList a b
l') = a -> AssocList a b -> (AssocList a b, AssocList a b)
forall a b.
Eq a =>
a -> AssocList a b -> (AssocList a b, AssocList a b)
break     a
key AssocList a b
l
        ([b]
xs, AssocList a b
after)  = a -> AssocList a b -> ([b], AssocList a b)
forall a b. Eq a => a -> AssocList a b -> ([b], AssocList a b)
partition a
key AssocList a b
l'
    in
        (AssocList a b
before, [b]
xs, AssocList a b
after)

-- $mapping
-- The "map" functions modify values while preserving the structure of
-- the assocative list. The resulting list has the same size and order
-- as the original.

-- | At the position where a particular key first appears in the list,
-- apply a function to the corresponding value.
--
-- >>> mapFirst 'B' negate [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',-4),('C',2),('B',6)]
--
-- If the key does not appear in the list, then the original list is
-- returned without modification.
--
-- >>> mapFirst 'D' negate [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',4),('C',2),('B',6)]

mapFirst :: Eq a => a -> (b -> b) -> AssocList a b -> AssocList a b
mapFirst :: a -> (b -> b) -> AssocList a b -> AssocList a b
mapFirst a
key b -> b
f AssocList a b
l =
    let
        (AssocList a b
before, AssocList a b
l') = a -> AssocList a b -> (AssocList a b, AssocList a b)
forall a b.
Eq a =>
a -> AssocList a b -> (AssocList a b, AssocList a b)
break a
key AssocList a b
l
    in
        AssocList a b
before AssocList a b -> AssocList a b -> AssocList a b
forall a. [a] -> [a] -> [a]
++
        case AssocList a b
l' of
            []              ->  AssocList a b
l'
            (a
x, b
y) : AssocList a b
after  ->  (a
x, b -> b
f b
y) (a, b) -> AssocList a b -> AssocList a b
forall a. a -> [a] -> [a]
: AssocList a b
after

-- | At each position where a particular key appears in the list,
-- apply a function to the corresponding value.
--
-- >>> mapAll 'B' negate [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',-4),('C',2),('B',-6)]
--
-- If the key does not appear in the list, then the original list is
-- returned without modification.
--
-- >>> mapAll 'D' negate [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',4),('C',2),('B',6)]

mapAll :: Eq a => a -> (b -> b) -> AssocList a b -> AssocList a b
mapAll :: a -> (b -> b) -> AssocList a b -> AssocList a b
mapAll a
key b -> b
f =
    ((a, b) -> (a, b)) -> AssocList a b -> AssocList a b
forall a b. (a -> b) -> [a] -> [b]
Data.List.map (a, b) -> (a, b)
g
  where
    g :: (a, b) -> (a, b)
g xy :: (a, b)
xy@(a
x, b
y)
        | a
key a -> a -> Bool
forall a. Eq a => a -> a -> Bool
== a
x   =  (a
x, b -> b
f b
y)
        | Bool
otherwise  =  (a, b)
xy

-- $alteration
-- The "alter" functions provide an all-in-one way to do insertion,
-- modification, and removal.

-- | Insert, modify, or delete a single value corresponding to
-- the first place where a particular key appears in the list.
--
-- __Modification__ - If the key first appears in the list with a
-- corresponding value of @x@, and @f x = 'Just' x'@, then that value
-- @x@ will be replaced with @x'@ in the resulting list.
--
-- >>> alterFirst 'B' (fmap negate) [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',-4),('C',2),('B',6)]
--
-- __Removal__ - If the key first appears in the list with a corresponding
-- value of @x@, and @f x = 'Nothing'@, then that mapping will be removed
-- in the resulting list.
--
-- >>> alterFirst 'B' (\_ -> Nothing) [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('C',2),('B',6)]
--
-- __Insertion__ - If the key does not appear in the list and
-- @f 'Nothing' = 'Just' x@, then @x@ be appended to the /end/ of the list.
--
-- >>> alterFirst 'D' (\_ -> Just 0) [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',4),('C',2),('B',6),('D',0)]

alterFirst :: Eq a => a -> (Maybe b -> Maybe b) -- ^ @f@
                        -> AssocList a b -> AssocList a b
alterFirst :: a -> (Maybe b -> Maybe b) -> AssocList a b -> AssocList a b
alterFirst a
key Maybe b -> Maybe b
f AssocList a b
l =
    let (AssocList a b
before, AssocList a b
l') = a -> AssocList a b -> (AssocList a b, AssocList a b)
forall a b.
Eq a =>
a -> AssocList a b -> (AssocList a b, AssocList a b)
break a
key AssocList a b
l
    in  AssocList a b
before AssocList a b -> AssocList a b -> AssocList a b
forall a. [a] -> [a] -> [a]
++ case AssocList a b
l' of
                      []              ->  Maybe (a, b) -> AssocList a b
forall a. Maybe a -> [a]
maybeToList ((,) a
key (b -> (a, b)) -> Maybe b -> Maybe (a, b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Maybe b -> Maybe b
f Maybe b
forall a. Maybe a
Nothing)
                      (a
x, b
y) : AssocList a b
after  ->  Maybe (a, b) -> AssocList a b
forall a. Maybe a -> [a]
maybeToList ((,) a
x   (b -> (a, b)) -> Maybe b -> Maybe (a, b)
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> Maybe b -> Maybe b
f (b -> Maybe b
forall a. a -> Maybe a
Just b
y))
                                          AssocList a b -> AssocList a b -> AssocList a b
forall a. [a] -> [a] -> [a]
++ AssocList a b
after

-- | Modify the list of values that correspond to a particular key.
--
-- __Mapping__ - For example, to negate all values of @'B'@:
--
-- >>> alterAll 'B' (map negate) [('A', 1), ('B', 4), ('B', 5), ('C', 2)]
-- [('A',1),('B',-4),('B',-5),('C',2)]
--
-- __Length alteration__ - For example, to limit the number of occurrences
-- of 'B' to at most two:
--
-- >>> alterAll 'B' (take 2) [('A', 1), ('B', 4), ('B', 5), ('B', 6), ('C', 2)]
-- [('A',1),('B',4),('B',5),('C',2)]
--
-- __Removal__ - If @f@ returns an empty list, then the key will be removed
-- from the list entirely.
--
-- >>> alterAll 'B' (\_ -> []) [('A', 1), ('B', 4), ('B', 5), ('C', 2)]
-- [('A',1),('C',2)]
--
-- __Reordering__ - The key may appear in multiple noncontiguous positions
-- in the input list, but all of the new mappings for the key in the output
-- will be in one contiguous sequence starting at the position where the
-- key /first/ appears in the input list.
--
-- >>> alterAll 'B' (map negate) [('A', 1), ('B', 4), ('C', 2), ('B', 5), ('D', 3), ('B', 6)]
-- [('A',1),('B',-4),('B',-5),('B',-6),('C',2),('D',3)]
--
-- __Insertion__ - If the key does not appear in the list, then any result
-- from @f@ will be appended to the /end/ of the list.
--
-- >>> alterAll 'D' (\_ -> [7, 8]) [('A', 1), ('B', 4), ('C', 2), ('B', 6)]
-- [('A',1),('B',4),('C',2),('B',6),('D',7),('D',8)]

alterAll :: Eq a => a -> ([b] -> [b]) -- ^ @f@
                      -> AssocList a b -> AssocList a b
alterAll :: a -> ([b] -> [b]) -> AssocList a b -> AssocList a b
alterAll a
key [b] -> [b]
f AssocList a b
l =
    let (AssocList a b
before, AssocList a b
l') = a -> AssocList a b -> (AssocList a b, AssocList a b)
forall a b.
Eq a =>
a -> AssocList a b -> (AssocList a b, AssocList a b)
break a
key AssocList a b
l
    in  AssocList a b
before AssocList a b -> AssocList a b -> AssocList a b
forall a. [a] -> [a] -> [a]
++ case AssocList a b
l' of
                      []  ->  (,) a
key (b -> (a, b)) -> [b] -> AssocList a b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [b] -> [b]
f []
                      AssocList a b
_   ->  let ([b]
ys, AssocList a b
after) = a -> AssocList a b -> ([b], AssocList a b)
forall a b. Eq a => a -> AssocList a b -> ([b], AssocList a b)
partition a
key AssocList a b
l'
                              in  ((,) a
key (b -> (a, b)) -> [b] -> AssocList a b
forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
<$> [b] -> [b]
f [b]
ys) AssocList a b -> AssocList a b -> AssocList a b
forall a. [a] -> [a] -> [a]
++ AssocList a b
after