{-# LANGUAGE CPP #-}
{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE TypeOperators #-}
module Data.Patch
( module Data.Patch
, module X
) where
import Data.Semigroup.Commutative
import Control.Applicative (liftA2)
import Data.Functor.Const (Const (..))
import Data.Functor.Identity
import Data.Map.Monoidal (MonoidalMap)
import Data.Proxy
#if !MIN_VERSION_base(4,11,0)
import Data.Semigroup (Semigroup (..))
#endif
import GHC.Generics
import qualified Data.Semigroup.Additive as X
import Data.Patch.Class as X
import Data.Patch.DMap as X hiding (getDeletions)
import Data.Patch.DMapWithMove as X
( PatchDMapWithMove, const2PatchDMapWithMoveWith, mapPatchDMapWithMove
, patchDMapWithMoveToPatchMapWithMoveWith
, traversePatchDMapWithMoveWithKey, unPatchDMapWithMove
, unsafePatchDMapWithMove, weakenPatchDMapWithMoveWith
)
import Data.Patch.IntMap as X hiding (getDeletions)
import Data.Patch.Map as X
import Data.Patch.MapWithMove as X
( PatchMapWithMove, patchMapWithMoveNewElements
, patchMapWithMoveNewElementsMap, unPatchMapWithMove
, unsafePatchMapWithMove
)
class (Semigroup q, Monoid q) => Group q where
negateG :: q -> q
(~~) :: q -> q -> q
r ~~ s = r <> negateG s
newtype AdditivePatch p = AdditivePatch { unAdditivePatch :: p }
instance Commutative p => Patch (AdditivePatch p) where
type PatchTarget (AdditivePatch p) = p
apply (AdditivePatch p) q = Just $ p <> q
instance (Ord k, Group q) => Group (MonoidalMap k q) where
negateG = fmap negateG
instance Group () where
negateG _ = ()
_ ~~ _ = ()
instance (Group a, Group b) => Group (a, b) where
negateG (a, b) = (negateG a, negateG b)
(a, b) ~~ (c, d) = (a ~~ c, b ~~ d)
instance Group (f (g a)) => Group ((f :.: g) a) where
negateG (Comp1 xs) = Comp1 (negateG xs)
Comp1 xs ~~ Comp1 ys = Comp1 (xs ~~ ys)
instance (Group (f a), Group (g a)) => Group ((f :*: g) a) where
negateG (a :*: b) = negateG a :*: negateG b
(a :*: b) ~~ (c :*: d) = (a ~~ c) :*: (b ~~ d)
instance Group (Proxy x) where
negateG _ = Proxy
_ ~~ _ = Proxy
deriving instance Group a => Group (Const a x)
deriving instance Group a => Group (Identity a)
instance Group b => Group (a -> b) where
negateG f = negateG . f
(~~) = liftA2 (~~)