2016-06-03 23:02:06 +03:00
|
|
|
{-# LANGUAGE DataKinds, TypeFamilies, ScopedTypeVariables #-}
|
2016-06-07 02:41:07 +03:00
|
|
|
|
2016-07-16 00:06:41 +03:00
|
|
|
module DiffSummary (DiffSummary(..), diffSummary, DiffInfo(..), annotatedSummaries) where
|
2016-04-25 18:46:10 +03:00
|
|
|
|
2016-06-28 23:38:06 +03:00
|
|
|
import Prologue hiding (snd, intercalate)
|
2016-04-25 18:46:10 +03:00
|
|
|
import Diff
|
|
|
|
import Patch
|
2016-05-17 22:59:07 +03:00
|
|
|
import Term
|
2016-07-25 19:35:22 +03:00
|
|
|
import Info (category)
|
2016-07-25 21:55:30 +03:00
|
|
|
import Syntax as S
|
|
|
|
import Category as C
|
2016-05-03 19:17:38 +03:00
|
|
|
import Data.Functor.Foldable as Foldable
|
2016-05-18 00:34:27 +03:00
|
|
|
import Data.Functor.Both
|
2016-07-13 18:58:43 +03:00
|
|
|
import Data.Text as Text (intercalate)
|
2016-07-13 21:32:53 +03:00
|
|
|
import Test.QuickCheck hiding (Fixed)
|
|
|
|
import Patch.Arbitrary()
|
2016-07-14 18:52:03 +03:00
|
|
|
import Data.Record
|
2016-07-16 00:06:41 +03:00
|
|
|
import Text.PrettyPrint.Leijen.Text ((<+>), squotes, space, string, Doc, punctuate, pretty)
|
2016-07-13 18:58:43 +03:00
|
|
|
import qualified Text.PrettyPrint.Leijen.Text as P
|
2016-04-25 18:46:10 +03:00
|
|
|
|
2016-07-15 20:18:45 +03:00
|
|
|
data DiffInfo = LeafInfo { categoryName :: Text, termName :: Text }
|
|
|
|
| BranchInfo { branches :: [ DiffInfo ], categoryName :: Text, branchType :: Branch }
|
|
|
|
deriving (Eq, Show)
|
2016-05-18 17:18:26 +03:00
|
|
|
|
2016-07-14 18:52:03 +03:00
|
|
|
toTermName :: (HasCategory leaf, HasField fields Category) => Term leaf (Record fields) -> Text
|
2016-06-14 23:50:34 +03:00
|
|
|
toTermName term = case unwrap term of
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Fixed children -> fromMaybe "branch" $ (toCategoryName . category) . extract <$> head children
|
|
|
|
S.Indexed children -> fromMaybe "branch" $ (toCategoryName . category) . extract <$> head children
|
2016-06-15 18:06:13 +03:00
|
|
|
Leaf leaf -> toCategoryName leaf
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Assignment identifier value -> toTermName identifier <> toTermName value
|
|
|
|
S.Function identifier _ _ -> (maybe "anonymous" toTermName identifier)
|
|
|
|
S.FunctionCall i _ -> toTermName i
|
|
|
|
S.MemberAccess base property -> case (unwrap base, unwrap property) of
|
|
|
|
(S.FunctionCall{}, S.FunctionCall{}) -> toTermName base <> "()." <> toTermName property <> "()"
|
|
|
|
(S.FunctionCall{}, _) -> toTermName base <> "()." <> toTermName property
|
|
|
|
(_, S.FunctionCall{}) -> toTermName base <> "." <> toTermName property <> "()"
|
2016-06-14 01:34:35 +03:00
|
|
|
(_, _) -> toTermName base <> "." <> toTermName property
|
2016-07-25 21:55:30 +03:00
|
|
|
S.MethodCall targetId methodId _ -> toTermName targetId <> sep <> toTermName methodId <> "()"
|
2016-06-15 00:04:27 +03:00
|
|
|
where sep = case unwrap targetId of
|
2016-07-25 21:55:30 +03:00
|
|
|
S.FunctionCall{} -> "()."
|
2016-06-15 00:04:27 +03:00
|
|
|
_ -> "."
|
2016-07-25 21:55:30 +03:00
|
|
|
S.SubscriptAccess base element -> case (unwrap base, unwrap element) of
|
|
|
|
(S.FunctionCall{}, S.FunctionCall{}) -> toTermName base <> "()." <> toTermName element <> "()"
|
|
|
|
(S.FunctionCall{}, _) -> toTermName base <> "()." <> toTermName element
|
|
|
|
(_, S.FunctionCall{}) -> toTermName base <> "[" <> toTermName element <> "()" <> "]"
|
2016-06-17 22:40:33 +03:00
|
|
|
(_, _) -> toTermName base <> "[" <> toTermName element <> "]"
|
2016-07-25 21:55:30 +03:00
|
|
|
S.VarAssignment varId _ -> toTermName varId
|
|
|
|
S.VarDecl decl -> toTermName decl
|
2016-06-16 01:51:17 +03:00
|
|
|
-- TODO: We should remove Args from Syntax since I don't think we should ever
|
2016-06-15 21:15:09 +03:00
|
|
|
-- evaluate Args as a single toTermName Text - joshvera
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Args args -> mconcat $ toTermName <$> args
|
2016-06-16 01:51:17 +03:00
|
|
|
-- TODO: We should remove Case from Syntax since I don't think we should ever
|
|
|
|
-- evaluate Case as a single toTermName Text - joshvera
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Case expr _ -> toTermName expr
|
|
|
|
S.Switch expr _ -> toTermName expr
|
|
|
|
S.Ternary expr _ -> toTermName expr
|
|
|
|
S.MathAssignment id _ -> toTermName id
|
|
|
|
S.Operator syntaxes -> mconcat $ toTermName <$> syntaxes
|
|
|
|
S.Object kvs -> "{" <> intercalate ", " (toTermName <$> kvs) <> "}"
|
|
|
|
S.Pair a b -> toTermName a <> ": " <> toTermName b
|
2016-07-11 19:55:32 +03:00
|
|
|
Comment a -> toCategoryName a
|
2016-05-18 20:27:19 +03:00
|
|
|
|
2016-05-24 19:49:16 +03:00
|
|
|
class HasCategory a where
|
2016-06-06 22:45:44 +03:00
|
|
|
toCategoryName :: a -> Text
|
2016-05-18 00:34:27 +03:00
|
|
|
|
2016-05-24 19:49:16 +03:00
|
|
|
instance HasCategory Text where
|
2016-06-06 22:45:44 +03:00
|
|
|
toCategoryName = identity
|
2016-05-18 19:01:16 +03:00
|
|
|
|
2016-05-24 19:49:16 +03:00
|
|
|
instance HasCategory Category where
|
2016-06-10 22:24:37 +03:00
|
|
|
toCategoryName = \case
|
2016-06-15 18:06:13 +03:00
|
|
|
ArrayLiteral -> "array"
|
2016-05-18 00:34:27 +03:00
|
|
|
BinaryOperator -> "binary operator"
|
2016-06-16 17:54:20 +03:00
|
|
|
Boolean -> "boolean"
|
2016-05-18 20:37:02 +03:00
|
|
|
DictionaryLiteral -> "dictionary"
|
2016-07-25 21:55:30 +03:00
|
|
|
C.Error -> "error"
|
2016-06-10 22:24:37 +03:00
|
|
|
ExpressionStatements -> "expression statements"
|
2016-07-25 21:55:30 +03:00
|
|
|
C.Assignment -> "assignment"
|
|
|
|
C.Function -> "function"
|
|
|
|
C.FunctionCall -> "function call"
|
|
|
|
C.MemberAccess -> "member access"
|
|
|
|
C.MethodCall -> "method call"
|
|
|
|
C.Args -> "arguments"
|
|
|
|
C.VarAssignment -> "var assignment"
|
|
|
|
C.VarDecl -> "variable"
|
|
|
|
C.Switch -> "switch statement"
|
|
|
|
C.Case -> "case statement"
|
|
|
|
C.SubscriptAccess -> "subscript access"
|
|
|
|
C.MathAssignment -> "math assignment"
|
|
|
|
C.Ternary -> "ternary"
|
|
|
|
C.Operator -> "operator"
|
2016-06-15 18:06:13 +03:00
|
|
|
Identifier -> "identifier"
|
|
|
|
IntegerLiteral -> "integer"
|
2016-06-04 01:34:42 +03:00
|
|
|
Other s -> s
|
2016-07-25 21:55:30 +03:00
|
|
|
C.Pair -> "pair"
|
2016-06-15 18:06:13 +03:00
|
|
|
Params -> "params"
|
|
|
|
Program -> "top level"
|
2016-06-15 19:09:52 +03:00
|
|
|
Regex -> "regex"
|
2016-06-15 18:06:13 +03:00
|
|
|
StringLiteral -> "string"
|
|
|
|
SymbolLiteral -> "symbol"
|
2016-06-15 18:39:18 +03:00
|
|
|
TemplateString -> "template string"
|
2016-07-25 21:55:30 +03:00
|
|
|
C.Object -> "object"
|
2016-05-17 20:09:14 +03:00
|
|
|
|
2016-07-14 18:52:03 +03:00
|
|
|
instance (HasCategory leaf, HasField fields Category) => HasCategory (Term leaf (Record fields)) where
|
2016-05-31 23:13:01 +03:00
|
|
|
toCategoryName = toCategoryName . category . extract
|
2016-05-24 19:49:16 +03:00
|
|
|
|
2016-07-26 01:39:22 +03:00
|
|
|
data Branch = BIndexed | BFixed | BCommented | BError deriving (Show, Eq, Generic)
|
2016-07-15 02:35:23 +03:00
|
|
|
instance Arbitrary Branch where
|
2016-07-15 20:18:45 +03:00
|
|
|
arbitrary = oneof [ pure BIndexed, pure BFixed ]
|
2016-07-15 02:35:23 +03:00
|
|
|
shrink = genericShrink
|
|
|
|
|
2016-05-17 20:09:14 +03:00
|
|
|
data DiffSummary a = DiffSummary {
|
2016-05-31 23:11:11 +03:00
|
|
|
patch :: Patch a,
|
2016-07-15 20:18:45 +03:00
|
|
|
parentAnnotations :: [Category]
|
2016-07-13 21:32:53 +03:00
|
|
|
} deriving (Eq, Functor, Show, Generic)
|
|
|
|
|
|
|
|
instance (Eq a, Arbitrary a) => Arbitrary (DiffSummary a) where
|
2016-07-15 20:18:45 +03:00
|
|
|
arbitrary = DiffSummary <$> arbitrary <*> arbitrary
|
2016-07-13 21:32:53 +03:00
|
|
|
shrink = genericShrink
|
2016-05-13 18:44:03 +03:00
|
|
|
|
2016-07-16 00:06:41 +03:00
|
|
|
instance P.Pretty DiffInfo where
|
|
|
|
pretty LeafInfo{..} = squotes (string $ toSL termName) <+> (string $ toSL categoryName)
|
|
|
|
pretty BranchInfo{..} = mconcat $ punctuate (string "," <> space) (pretty <$> branches)
|
|
|
|
|
|
|
|
annotatedSummaries :: DiffSummary DiffInfo -> [Text]
|
|
|
|
annotatedSummaries DiffSummary{..} = show . (P.<> maybeParentContext parentAnnotations) <$> summaries patch
|
|
|
|
|
|
|
|
summaries :: Patch DiffInfo -> [P.Doc]
|
|
|
|
summaries (Insert info) = (("Added" <+> "the") <+>) <$> toLeafInfos info
|
|
|
|
summaries (Delete info) = (("Deleted" <+> "the") <+>) <$> toLeafInfos info
|
|
|
|
summaries (Replace i1 i2) = zipWith (\a b -> "Replaced" <+> "the" <+> a <+> "with the" <+> b) (toLeafInfos i1) (toLeafInfos i2)
|
|
|
|
|
|
|
|
toLeafInfos :: DiffInfo -> [Doc]
|
|
|
|
toLeafInfos LeafInfo{..} = [ squotes (toDoc termName) <+> (toDoc categoryName) ]
|
|
|
|
toLeafInfos BranchInfo{..} = pretty <$> branches
|
|
|
|
|
|
|
|
maybeParentContext :: [Category] -> Doc
|
|
|
|
maybeParentContext annotations = if null annotations
|
|
|
|
then ""
|
|
|
|
else space <> "in the" <+> (toDoc . intercalate "/" $ toCategoryName <$> annotations) <+> "context"
|
|
|
|
toDoc :: Text -> Doc
|
|
|
|
toDoc = string . toS
|
2016-04-25 18:46:10 +03:00
|
|
|
|
2016-07-15 21:10:31 +03:00
|
|
|
diffSummary :: (HasCategory leaf, HasField fields Category) => Diff leaf (Record fields) -> [DiffSummary DiffInfo]
|
2016-06-06 21:45:45 +03:00
|
|
|
diffSummary = cata $ \case
|
2016-07-11 19:56:00 +03:00
|
|
|
-- Skip comments and leaves since they don't have any changes
|
|
|
|
(Free (_ :< Leaf _)) -> []
|
2016-07-25 21:55:30 +03:00
|
|
|
Free (_ :< (S.Comment _)) -> []
|
|
|
|
(Free (infos :< S.Indexed children)) -> prependSummary (category $ snd infos) <$> join children
|
|
|
|
(Free (infos :< S.Fixed children)) -> prependSummary (category $ snd infos) <$> join children
|
|
|
|
(Free (infos :< S.FunctionCall identifier children)) -> prependSummary (category $ snd infos) <$> join (Prologue.toList (identifier : children))
|
|
|
|
(Free (infos :< S.Function id ps body)) -> prependSummary (category $ snd infos) <$> (fromMaybe [] id) <> (fromMaybe [] ps) <> body
|
|
|
|
(Free (infos :< S.Assignment id value)) -> prependSummary (category $ snd infos) <$> id <> value
|
|
|
|
(Free (infos :< S.MemberAccess base property)) -> prependSummary (category $ snd infos) <$> base <> property
|
|
|
|
(Free (infos :< S.SubscriptAccess base property)) -> prependSummary (category $ snd infos) <$> base <> property
|
|
|
|
(Free (infos :< S.MethodCall targetId methodId ps)) -> prependSummary (category $ snd infos) <$> targetId <> methodId <> ps
|
|
|
|
(Free (infos :< S.VarAssignment varId value)) -> prependSummary (category $ snd infos) <$> varId <> value
|
|
|
|
(Free (infos :< S.VarDecl decl)) -> prependSummary (category $ snd infos) <$> decl
|
|
|
|
(Free (infos :< S.Args args)) -> prependSummary (category $ snd infos) <$> join args
|
|
|
|
(Free (infos :< S.Switch expr cases)) -> prependSummary (category $ snd infos) <$> expr <> join cases
|
|
|
|
(Free (infos :< S.Case expr body)) -> prependSummary (category $ snd infos) <$> expr <> body
|
|
|
|
Free (infos :< (S.Ternary expr cases)) -> prependSummary (category $ snd infos) <$> expr <> join cases
|
|
|
|
Free (infos :< (S.MathAssignment id value)) -> prependSummary (category $ snd infos) <$> id <> value
|
|
|
|
Free (infos :< (S.Operator syntaxes)) -> prependSummary (category $ snd infos) <$> join syntaxes
|
|
|
|
Free (infos :< (S.Object kvs)) -> prependSummary (category $ snd infos) <$> join kvs
|
|
|
|
Free (infos :< (S.Pair a b)) -> prependSummary (category $ snd infos) <$> a <> b
|
|
|
|
Free (infos :< (S.Commented cs leaf)) -> prependSummary (category $ snd infos) <$> join cs <> fromMaybe [] leaf
|
|
|
|
Free (infos :< (S.Error children)) -> prependSummary (category $ snd infos) <$> join children
|
2016-07-15 20:18:45 +03:00
|
|
|
(Pure (Insert term)) -> [ DiffSummary (Insert $ termToDiffInfo term) [] ]
|
|
|
|
(Pure (Delete term)) -> [ DiffSummary (Delete $ termToDiffInfo term) [] ]
|
|
|
|
(Pure (Replace t1 t2)) -> [ DiffSummary (Replace (termToDiffInfo t1) (termToDiffInfo t2)) [] ]
|
|
|
|
|
|
|
|
termToDiffInfo :: (HasCategory leaf, HasField fields Category) => Term leaf (Record fields) -> DiffInfo
|
2016-07-22 21:20:03 +03:00
|
|
|
termToDiffInfo term = case unwrap term of
|
2016-07-22 21:39:54 +03:00
|
|
|
Leaf _ -> LeafInfo (toCategoryName term) (toTermName term)
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Indexed children -> BranchInfo (termToDiffInfo <$> children) (toCategoryName term) BIndexed
|
|
|
|
S.Fixed children -> BranchInfo (termToDiffInfo <$> children) (toCategoryName term) BFixed
|
|
|
|
S.FunctionCall identifier _ -> LeafInfo (toCategoryName term) (toTermName identifier)
|
|
|
|
S.Ternary ternaryCondition _ -> LeafInfo (toCategoryName term) (toTermName ternaryCondition)
|
|
|
|
S.Function identifier _ _ -> LeafInfo (toCategoryName term) (maybe "anonymous" toTermName identifier)
|
|
|
|
S.Assignment identifier _ -> LeafInfo (toCategoryName term) (toTermName identifier)
|
|
|
|
S.MathAssignment identifier _ -> LeafInfo (toCategoryName term) (toTermName identifier)
|
2016-06-18 01:03:55 +03:00
|
|
|
-- Currently we cannot express the operator for an operator production from TreeSitter. Eventually we should be able to
|
|
|
|
-- use the term name of the operator identifier when we have that production value. Until then, I'm using a placeholder value
|
|
|
|
-- to indicate where that value should be when constructing DiffInfos.
|
2016-07-25 21:55:30 +03:00
|
|
|
S.Operator _ -> LeafInfo (toCategoryName term) "x"
|
2016-07-22 21:39:54 +03:00
|
|
|
Commented cs leaf -> BranchInfo (termToDiffInfo <$> cs <> maybeToList leaf) (toCategoryName term) BCommented
|
2016-07-26 01:41:22 +03:00
|
|
|
S.Error children -> BranchInfo (termToDiffInfo <$> children) (toCategoryName term) BError
|
2016-07-26 03:32:14 +03:00
|
|
|
_ -> LeafInfo (toCategoryName term) (toTermName term)
|
2016-05-16 17:54:05 +03:00
|
|
|
|
2016-06-08 21:46:38 +03:00
|
|
|
prependSummary :: Category -> DiffSummary DiffInfo -> DiffSummary DiffInfo
|
2016-05-16 17:54:05 +03:00
|
|
|
prependSummary annotation summary = summary { parentAnnotations = annotation : parentAnnotations summary }
|