1
1
mirror of https://github.com/github/semantic.git synced 2024-11-28 10:15:55 +03:00
semantic/src/Unified.hs

48 lines
1.8 KiB
Haskell
Raw Normal View History

2015-11-20 00:35:06 +03:00
module Unified where
2015-11-20 01:36:32 +03:00
import Diff
import Patch
import Syntax
import Term
2015-11-20 02:53:23 +03:00
import Control.Arrow
import Control.Monad.Free
2015-11-20 02:53:23 +03:00
import Control.Comonad.Cofree
2015-11-20 04:23:06 +03:00
import Data.List hiding (foldl)
2015-11-20 04:22:55 +03:00
import qualified Data.Map as Map
2015-11-20 01:36:32 +03:00
unified :: Diff a Info -> String -> String -> String
unified diff before after =
2015-11-20 04:22:55 +03:00
fst $ iter g mapped where
2015-11-20 02:53:23 +03:00
mapped = fmap (unifiedPatch &&& range) diff
2015-11-20 04:22:55 +03:00
g (Annotated (_, info) syntax) = f info syntax
f (Info range _) (Leaf _) = (substring range after, Just range)
f (Info range _) (Indexed i) = (unifiedRange range i after, Just range)
f (Info range _) (Fixed f) = (unifiedRange range f after, Just range)
f (Info range _) (Keyed k) = (unifiedRange range (sort $ snd <$> Map.toList k) after, Just range)
2015-11-20 02:53:23 +03:00
2015-11-20 04:23:41 +03:00
unifiedPatch :: Patch (Term a Info) -> String
unifiedPatch _ = ""
2015-11-20 04:23:12 +03:00
unifiedTerm :: Term a Info -> String -> String
unifiedTerm term source = fst $ cata f term
2015-11-20 03:27:31 +03:00
2015-11-20 02:08:11 +03:00
unifiedRange :: Range -> [(String, Maybe Range)] -> String -> String
unifiedRange range children source = out ++ substring Range { start = previous, end = end range } after where
2015-11-20 04:23:06 +03:00
(out, previous) = foldl accumulateContext ("", start range) children
2015-11-20 02:56:58 +03:00
accumulateContext (out, previous) (child, Just range) = (out ++ substring Range { start = previous, end = start range } source ++ child, end range)
accumulateContext (out, previous) (child, _) = (out ++ child, previous)
2015-11-20 02:05:33 +03:00
substring :: Range -> String -> String
substring range = take (end range) . drop (start range)
2015-11-20 02:30:37 +03:00
range :: Patch (Term a Info) -> Maybe Range
range patch = range . extract <$> after patch where
extract (annotation :< _) = annotation
range (Info range _) = range
2015-11-20 03:07:30 +03:00
change :: String -> String -> String
change bound content = "{" ++ bound ++ content ++ bound ++ "}"
2015-11-20 03:23:18 +03:00
instance Ord Range where
a <= b = start a <= start b