module Data.Algorithm.DiffContext
( getContextDiffNew
, getContextDiff
, getContextDiffOld
, prettyContextDiff
) where
import Data.Algorithm.Diff (PolyDiff(..), Diff, getGroupedDiff)
import Data.List (groupBy)
import Data.Monoid (mappend)
import Text.PrettyPrint (Doc, text, empty, hcat)
type ContextDiff c = [[Diff [c]]]
groupBy' :: (a -> a -> Bool) -> [a] -> [[a]]
groupBy' :: forall a. (a -> a -> Bool) -> [a] -> [[a]]
groupBy' a -> a -> Bool
_ [] = []
groupBy' a -> a -> Bool
eq (a
x : [a]
xs) = [a] -> [a] -> [[a]]
go [a
x] [a]
xs
where
go :: [a] -> [a] -> [[a]]
go (a
x : [a]
xs) (a
y : [a]
zs) | a -> a -> Bool
eq a
x a
y = [a] -> [a] -> [[a]]
go (a
y forall a. a -> [a] -> [a]
: a
x forall a. a -> [a] -> [a]
: [a]
xs) [a]
zs
go [a]
g (a
y : [a]
zs) = forall a. [a] -> [a]
reverse [a]
g forall a. a -> [a] -> [a]
: [a] -> [a] -> [[a]]
go [a
y] [a]
zs
go [a]
g [] = [forall a. [a] -> [a]
reverse [a]
g]
getContextDiffNew ::
Eq a
=> Maybe Int
-> [a]
-> [a]
-> ContextDiff a
getContextDiffNew :: forall a. Eq a => Maybe Int -> [a] -> [a] -> ContextDiff a
getContextDiffNew Maybe Int
context [a]
a [a]
b =
forall a. (a -> a -> Bool) -> [a] -> [[a]]
groupBy' (\Diff [a]
a Diff [a]
b -> Bool -> Bool
not (forall {a} {b}. PolyDiff a b -> Bool
isBoth Diff [a]
a Bool -> Bool -> Bool
&& forall {a} {b}. PolyDiff a b -> Bool
isBoth Diff [a]
b)) forall a b. (a -> b) -> a -> b
$ forall {a} {a}. [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doPrefix forall a b. (a -> b) -> a -> b
$ forall a. Eq a => [a] -> [a] -> [Diff [a]]
getGroupedDiff [a]
a [a]
b
where
isBoth :: PolyDiff a b -> Bool
isBoth (Both {}) = Bool
True
isBoth PolyDiff a b
_ = Bool
False
doPrefix :: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doPrefix [] = []
doPrefix [Both [a]
_ [a]
_] = []
doPrefix (Both [a]
xs [a]
ys : [PolyDiff [a] [a]]
more) =
forall a b. a -> b -> PolyDiff a b
Both (forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
xs (\Int
n -> forall a. Int -> [a] -> [a]
drop (forall a. Ord a => a -> a -> a
max Int
0 (forall (t :: * -> *) a. Foldable t => t a -> Int
length [a]
xs forall a. Num a => a -> a -> a
- Int
n)) [a]
xs) Maybe Int
context)
(forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
ys (\Int
n -> forall a. Int -> [a] -> [a]
drop (forall a. Ord a => a -> a -> a
max Int
0 (forall (t :: * -> *) a. Foldable t => t a -> Int
length [a]
ys forall a. Num a => a -> a -> a
- Int
n)) [a]
ys) Maybe Int
context) forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doSuffix [PolyDiff [a] [a]]
more
doPrefix (PolyDiff [a] [a]
d : [PolyDiff [a] [a]]
ds) = [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doSuffix (PolyDiff [a] [a]
d forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]]
ds)
doSuffix :: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doSuffix [] = []
doSuffix [Both [a]
xs [a]
ys] = [forall a b. a -> b -> PolyDiff a b
Both (forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
xs (\Int
n -> forall a. Int -> [a] -> [a]
take Int
n [a]
xs) Maybe Int
context) (forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
ys (\Int
n -> forall a. Int -> [a] -> [a]
take Int
n [a]
ys) Maybe Int
context)]
doSuffix (Both [a]
xs [a]
ys : [PolyDiff [a] [a]]
more)
| forall b a. b -> (a -> b) -> Maybe a -> b
maybe Bool
True (\Int
n -> forall (t :: * -> *) a. Foldable t => t a -> Int
length [a]
xs forall a. Ord a => a -> a -> Bool
<= Int
n forall a. Num a => a -> a -> a
* Int
2) Maybe Int
context =
forall a b. a -> b -> PolyDiff a b
Both [a]
xs [a]
ys forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doPrefix [PolyDiff [a] [a]]
more
doSuffix (Both [a]
xs [a]
ys : [PolyDiff [a] [a]]
more) =
forall a b. a -> b -> PolyDiff a b
Both (forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
xs (\Int
n -> forall a. Int -> [a] -> [a]
take Int
n [a]
xs) Maybe Int
context) (forall b a. b -> (a -> b) -> Maybe a -> b
maybe [a]
ys (\Int
n -> forall a. Int -> [a] -> [a]
take Int
n [a]
ys) Maybe Int
context)
forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doPrefix (forall a b. a -> b -> PolyDiff a b
Both (forall b a. b -> (a -> b) -> Maybe a -> b
maybe forall a. Monoid a => a
mempty (\Int
n -> forall a. Int -> [a] -> [a]
drop Int
n [a]
xs) Maybe Int
context) (forall b a. b -> (a -> b) -> Maybe a -> b
maybe forall a. Monoid a => a
mempty (\Int
n -> forall a. Int -> [a] -> [a]
drop Int
n [a]
ys) Maybe Int
context) forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]]
more)
doSuffix (PolyDiff [a] [a]
d : [PolyDiff [a] [a]]
ds) = PolyDiff [a] [a]
d forall a. a -> [a] -> [a]
: [PolyDiff [a] [a]] -> [PolyDiff [a] [a]]
doSuffix [PolyDiff [a] [a]]
ds
getContextDiff :: Eq a => Int -> [a] -> [a] -> ContextDiff a
getContextDiff :: forall a. Eq a => Int -> [a] -> [a] -> ContextDiff a
getContextDiff Int
context [a]
a [a]
b = forall a. Eq a => Maybe Int -> [a] -> [a] -> ContextDiff a
getContextDiffNew (forall a. a -> Maybe a
Just Int
context) [a]
a [a]
b
getContextDiffOld :: Eq a => Int -> [a] -> [a] -> ContextDiff a
getContextDiffOld :: forall a. Eq a => Int -> [a] -> [a] -> ContextDiff a
getContextDiffOld Int
context [a]
a [a]
b =
forall {a} {b}. [PolyDiff a b] -> [[PolyDiff a b]]
group forall a b. (a -> b) -> a -> b
$ forall {a} {b}. [PolyDiff a b] -> [PolyDiff a b]
swap forall a b. (a -> b) -> a -> b
$ forall {a} {b}. [PolyDiff a b] -> [PolyDiff a b]
trimTail forall a b. (a -> b) -> a -> b
$ forall {a} {b}. [PolyDiff a b] -> [PolyDiff a b]
trimHead forall a b. (a -> b) -> a -> b
$ forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap forall {a} {a}. PolyDiff [a] [a] -> [PolyDiff [a] [a]]
split forall a b. (a -> b) -> a -> b
$ forall a. Eq a => [a] -> [a] -> [Diff [a]]
getGroupedDiff [a]
a [a]
b
where
split :: PolyDiff [a] [a] -> [PolyDiff [a] [a]]
split (Both [a]
xs [a]
ys) =
case forall (t :: * -> *) a. Foldable t => t a -> Int
length [a]
xs of
Int
n | Int
n forall a. Ord a => a -> a -> Bool
> (Int
2 forall a. Num a => a -> a -> a
* Int
context) -> [forall a b. a -> b -> PolyDiff a b
Both (forall a. Int -> [a] -> [a]
take Int
context [a]
xs) (forall a. Int -> [a] -> [a]
take Int
context [a]
ys), forall a b. a -> b -> PolyDiff a b
Both (forall a. Int -> [a] -> [a]
drop (Int
n forall a. Num a => a -> a -> a
- Int
context) [a]
xs) (forall a. Int -> [a] -> [a]
drop (Int
n forall a. Num a => a -> a -> a
- Int
context) [a]
ys)]
Int
_ -> [forall a b. a -> b -> PolyDiff a b
Both [a]
xs [a]
ys]
split PolyDiff [a] [a]
x = [PolyDiff [a] [a]
x]
trimHead :: [PolyDiff a b] -> [PolyDiff a b]
trimHead [] = []
trimHead [Both a
_ b
_] = []
trimHead [Both a
_ b
_, Both a
_ b
_] = []
trimHead (Both a
_ b
_ : x :: PolyDiff a b
x@(Both a
_ b
_) : [PolyDiff a b]
more) = PolyDiff a b
x forall a. a -> [a] -> [a]
: [PolyDiff a b]
more
trimHead [PolyDiff a b]
xs = forall {a} {b}. [PolyDiff a b] -> [PolyDiff a b]
trimTail [PolyDiff a b]
xs
trimTail :: [PolyDiff a b] -> [PolyDiff a b]
trimTail [x :: PolyDiff a b
x@(Both a
_ b
_), Both a
_ b
_] = [PolyDiff a b
x]
trimTail (PolyDiff a b
x : [PolyDiff a b]
more) = PolyDiff a b
x forall a. a -> [a] -> [a]
: [PolyDiff a b] -> [PolyDiff a b]
trimTail [PolyDiff a b]
more
trimTail [] = []
swap :: [PolyDiff a b] -> [PolyDiff a b]
swap (x :: PolyDiff a b
x@(Second b
_) : y :: PolyDiff a b
y@(First a
_) : [PolyDiff a b]
xs) = PolyDiff a b
y forall a. a -> [a] -> [a]
: PolyDiff a b
x forall a. a -> [a] -> [a]
: [PolyDiff a b] -> [PolyDiff a b]
swap [PolyDiff a b]
xs
swap (PolyDiff a b
x : [PolyDiff a b]
xs) = PolyDiff a b
x forall a. a -> [a] -> [a]
: [PolyDiff a b] -> [PolyDiff a b]
swap [PolyDiff a b]
xs
swap [] = []
group :: [PolyDiff a b] -> [[PolyDiff a b]]
group [PolyDiff a b]
xs =
forall a. (a -> a -> Bool) -> [a] -> [[a]]
groupBy (\ PolyDiff a b
x PolyDiff a b
y -> Bool -> Bool
not (forall {a} {b}. PolyDiff a b -> Bool
isBoth PolyDiff a b
x Bool -> Bool -> Bool
&& forall {a} {b}. PolyDiff a b -> Bool
isBoth PolyDiff a b
y)) [PolyDiff a b]
xs
where
isBoth :: PolyDiff a b -> Bool
isBoth (Both a
_ b
_) = Bool
True
isBoth PolyDiff a b
_ = Bool
False
prettyContextDiff ::
Doc
-> Doc
-> (c -> Doc)
-> ContextDiff c
-> Doc
prettyContextDiff :: forall c. Doc -> Doc -> (c -> Doc) -> ContextDiff c -> Doc
prettyContextDiff Doc
_ Doc
_ c -> Doc
_ [] = Doc
empty
prettyContextDiff Doc
old Doc
new c -> Doc
prettyElem [[Diff [c]]]
hunks =
[Doc] -> Doc
hcat forall b c a. (b -> c) -> (a -> b) -> a -> c
. forall a b. (a -> b) -> [a] -> [b]
map (forall a. Monoid a => a -> a -> a
`mappend` String -> Doc
text String
"\n") forall a b. (a -> b) -> a -> b
$ (String -> Doc
text String
"--- " forall a. Monoid a => a -> a -> a
`mappend` Doc
old forall a. a -> [a] -> [a]
:
String -> Doc
text String
"+++ " forall a. Monoid a => a -> a -> a
`mappend` Doc
new forall a. a -> [a] -> [a]
:
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap forall {t :: * -> *}. Foldable t => t (Diff [c]) -> [Doc]
prettyRun [[Diff [c]]]
hunks)
where
prettyRun :: t (Diff [c]) -> [Doc]
prettyRun t (Diff [c])
hunk =
String -> Doc
text String
"@@" forall a. a -> [a] -> [a]
: forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap Diff [c] -> [Doc]
prettyChange t (Diff [c])
hunk
prettyChange :: Diff [c] -> [Doc]
prettyChange (Both [c]
ts [c]
_) = forall a b. (a -> b) -> [a] -> [b]
map (\ c
l -> String -> Doc
text String
" " forall a. Monoid a => a -> a -> a
`mappend` c -> Doc
prettyElem c
l) [c]
ts
prettyChange (First [c]
ts) = forall a b. (a -> b) -> [a] -> [b]
map (\ c
l -> String -> Doc
text String
"-" forall a. Monoid a => a -> a -> a
`mappend` c -> Doc
prettyElem c
l) [c]
ts
prettyChange (Second [c]
ts) = forall a b. (a -> b) -> [a] -> [b]
map (\ c
l -> String -> Doc
text String
"+" forall a. Monoid a => a -> a -> a
`mappend` c -> Doc
prettyElem c
l) [c]
ts