1
1
mirror of https://github.com/github/semantic.git synced 2024-12-26 16:33:03 +03:00
semantic/src/Renderer/TOC.hs

219 lines
10 KiB
Haskell
Raw Normal View History

{-# LANGUAGE DeriveAnyClass, RankNTypes #-}
2017-05-10 18:56:06 +03:00
module Renderer.TOC
( toc
, diffTOC
, JSONSummary(..)
, Summarizable(..)
, isValidSummary
2017-05-10 18:57:28 +03:00
, Declaration(..)
, declaration
, declarationAlgebra
2017-05-10 18:57:10 +03:00
, Entry(..)
, entryPayload
2017-05-10 18:56:06 +03:00
, tableOfContentsBy
2017-05-11 22:36:25 +03:00
, dedupe
, entrySummary
2017-05-10 18:56:06 +03:00
) where
2017-01-23 19:22:51 +03:00
2017-01-23 22:12:05 +03:00
import Category as C
import Data.Aeson
2017-05-11 21:22:39 +03:00
import Data.Align (crosswalk)
2017-01-23 22:12:05 +03:00
import Data.Functor.Both hiding (fst, snd)
2017-01-24 00:59:47 +03:00
import qualified Data.Functor.Both as Both
import Data.Functor.Listable
import Data.Text (toLower)
import Data.Text.Listable
import Data.These
2017-01-23 19:22:51 +03:00
import Data.Record
2017-01-23 22:12:05 +03:00
import Diff
2017-01-23 19:22:51 +03:00
import Info
2017-05-11 21:22:39 +03:00
import Patch
2017-01-23 22:12:05 +03:00
import Prologue
import Renderer.Summary (Summaries(..))
2017-01-23 22:12:05 +03:00
import qualified Data.List as List
import qualified Data.Map as Map hiding (null)
import Source hiding (null)
2017-01-23 22:12:05 +03:00
import Syntax as S
import Term
2017-01-23 20:16:59 +03:00
data JSONSummary = JSONSummary { info :: Summarizable }
| ErrorSummary { error :: Text, errorSpan :: SourceSpan }
2017-01-23 22:12:05 +03:00
deriving (Generic, Eq, Show)
instance ToJSON JSONSummary where
2017-05-09 18:16:17 +03:00
toJSON (JSONSummary Summarizable{..}) = object [ "changeType" .= summarizableChangeType, "category" .= toCategoryName summarizableCategory, "term" .= summarizableTermName, "span" .= summarizableSourceSpan ]
toJSON ErrorSummary{..} = object [ "error" .= error, "span" .= errorSpan ]
2017-01-23 22:12:05 +03:00
isValidSummary :: JSONSummary -> Bool
isValidSummary ErrorSummary{} = False
isValidSummary _ = True
2017-01-23 20:16:59 +03:00
2017-05-09 18:02:15 +03:00
data DiffInfo = DiffInfo
2017-05-09 18:08:18 +03:00
{ infoCategory :: Maybe Category
2017-05-09 18:02:15 +03:00
, infoName :: Text
, infoSpan :: SourceSpan
}
2017-05-08 23:00:29 +03:00
deriving (Eq, Show)
2017-01-23 20:16:59 +03:00
2017-05-09 18:13:17 +03:00
data TOCSummary a = TOCSummary
{ summaryPatch :: Patch a
, parentInfo :: Maybe Summarizable
}
2017-05-09 17:07:21 +03:00
deriving (Eq, Functor, Show, Generic)
2017-01-23 20:16:59 +03:00
data Summarizable
= Summarizable
{ summarizableCategory :: Category
, summarizableTermName :: Text
, summarizableSourceSpan :: SourceSpan
, summarizableChangeType :: Text
}
deriving (Eq, Show)
2017-05-10 18:57:28 +03:00
-- | A declarations identifier and type.
2017-05-10 19:39:12 +03:00
data Declaration
2017-05-10 19:40:07 +03:00
= MethodDeclaration { declarationIdentifier :: Text }
2017-05-10 19:39:12 +03:00
| FunctionDeclaration { declarationIdentifier :: Text }
2017-05-11 21:17:48 +03:00
| ErrorDeclaration { declarationIdentifier :: Text }
deriving (Eq, Generic, NFData, Show)
2017-05-10 18:57:28 +03:00
2017-05-10 19:01:26 +03:00
-- | Produce the annotations of nodes representing declarations.
2017-05-11 21:02:25 +03:00
declaration :: (HasField fields (Maybe Declaration), HasField fields Category) => TermF (Syntax Text) (Record fields) a -> Maybe (Record fields)
declaration (annotation :< syntax)
| S.ParseError{} <- syntax = Just (setCategory annotation C.ParseError)
| C.ParseError <- category annotation = Just annotation
| otherwise = annotation <$ (getField annotation :: Maybe Declaration)
2017-05-10 19:10:46 +03:00
-- | Compute 'Declaration's for methods and functions.
declarationAlgebra :: HasField fields Range => Source -> TermF (Syntax Text) (Record fields) (Term (Syntax Text) (Record fields), Maybe Declaration) -> Maybe Declaration
declarationAlgebra source r = case tailF r of
2017-05-10 19:39:12 +03:00
S.Function (identifier, _) _ _ -> Just $ FunctionDeclaration (getSource identifier)
S.Method _ (identifier, _) Nothing _ _ -> Just $ MethodDeclaration (getSource identifier)
S.Method _ (identifier, _) (Just (receiver, _)) _ _
| S.Indexed [receiverParams] <- unwrap receiver
2017-05-10 19:39:12 +03:00
, S.ParameterDecl (Just ty) _ <- unwrap receiverParams -> Just $ MethodDeclaration ("(" <> getSource ty <> ") " <> getSource identifier)
| otherwise -> Just $ MethodDeclaration (getSource receiver <> "." <> getSource identifier)
2017-05-11 21:17:48 +03:00
S.ParseError{} -> Just $ ErrorDeclaration (toText (Source.slice (byteRange (headF r)) source))
_ -> Nothing
where getSource = toText . flip Source.slice source . byteRange . extract
2017-05-10 17:24:43 +03:00
-- | An entry in a table of contents.
data Entry a
= Unchanged a -- ^ An entry for an unchanged portion of a diff (i.e. a diff node not containing any patches).
| Changed a -- ^ An entry for a node containing changes.
| Inserted a -- ^ An entry for a change occurring inside an 'Insert' 'Patch'.
| Deleted a -- ^ An entry for a change occurring inside a 'Delete' 'Patch'.
| Replaced a -- ^ An entry for a change occurring inside a 'Replace' 'Patch'.
deriving (Eq, Show)
entryPayload :: Entry a -> a
entryPayload (Unchanged a) = a
entryPayload (Changed a) = a
entryPayload (Inserted a) = a
entryPayload (Deleted a) = a
entryPayload (Replaced a) = a
2017-05-10 17:21:00 +03:00
-- | Compute a table of contents for a diff characterized by a function mapping relevant nodes onto values in Maybe.
tableOfContentsBy :: Traversable f
=> (forall b. TermF f annotation b -> Maybe a) -- ^ A function mapping relevant nodes onto values in Maybe.
-> Diff f annotation -- ^ The diff to compute the table of contents for.
-> [Entry a] -- ^ A list of entries for relevant changed and unchanged nodes in the diff.
tableOfContentsBy selector = fromMaybe [] . iter diffAlgebra . fmap (Just . foldMap (these (pure . Deleted) (pure . Inserted) ((<>) `on` pure . Replaced) . unPatch) . crosswalk (cata termAlgebra))
2017-05-10 21:28:10 +03:00
where diffAlgebra r = case (selector (first Both.snd r), fold r) of
(Just a, Nothing) -> Just [Unchanged a]
(Just a, Just []) -> Just [Changed a]
2017-05-10 21:29:28 +03:00
(_ , entries) -> entries
termAlgebra r | Just a <- selector r = [a]
| otherwise = fold r
2017-05-11 22:36:25 +03:00
dedupe :: (HasField fields Category, HasField fields (Maybe Declaration)) => [Entry (Record fields)] -> [Entry (Record fields)]
dedupe = foldl' go []
where go xs x | (_, _:_) <- find (exactMatch `on` entryPayload) x xs = xs
2017-05-11 23:05:56 +03:00
| (front, similar : back) <- find (similarMatch `on` entryPayload) x xs =
front <> (similar : back)
2017-05-11 22:36:25 +03:00
| otherwise = xs <> [x]
find p x = List.break (p x)
exactMatch = (==) `on` getDeclaration
similarMatch a b = sameCategory a b && similarDeclaration a b
sameCategory = (==) `on` category
similarDeclaration = (==) `on` fmap (toLower . declarationIdentifier) . getDeclaration
getDeclaration :: HasField fields (Maybe Declaration) => Record fields -> Maybe Declaration
getDeclaration = getField
2017-05-11 22:25:12 +03:00
-- | Construct a 'JSONSummary' from an 'Entry'. Returns 'Nothing' for 'Unchanged' patches.
entrySummary :: (HasField fields Category, HasField fields (Maybe Declaration), HasField fields SourceSpan) => Entry (Record fields) -> Maybe JSONSummary
entrySummary entry = case entry of
Unchanged _ -> Nothing
Changed a -> Just (recordSummary a "modified")
Deleted a -> Just (recordSummary a "deleted")
Inserted a -> Just (recordSummary a "inserted")
Replaced a -> Just (recordSummary a "replaced")
where recordSummary record
| C.ParseError <- category record = const (ErrorSummary (maybe "" declarationIdentifier (getField record :: Maybe Declaration)) (sourceSpan record))
| otherwise = JSONSummary . Summarizable (category record) (maybe "" declarationIdentifier (getField record :: Maybe Declaration)) (sourceSpan record)
2017-05-10 22:46:04 +03:00
toc :: (HasField fields Category, HasField fields (Maybe Declaration), HasField fields SourceSpan) => Both SourceBlob -> Diff (Syntax Text) (Record fields) -> Summaries
toc blobs = uncurry Summaries . bimap toMap toMap . List.partition isValidSummary . diffTOC blobs
where toMap [] = mempty
toMap as = Map.singleton summaryKey (toJSON <$> as)
summaryKey = toS $ case runJoin (path <$> blobs) of
(before, after) | null before -> after
| null after -> before
| before == after -> after
| otherwise -> before <> " -> " <> after
2017-03-31 23:48:06 +03:00
diffTOC :: (HasField fields Category, HasField fields (Maybe Declaration), HasField fields SourceSpan) => Both SourceBlob -> Diff (Syntax Text) (Record fields) -> [JSONSummary]
diffTOC blobs = mapMaybe entrySummary . dedupe . tableOfContentsBy declaration
2017-05-09 19:44:02 +03:00
toInfo :: HasDefaultFields fields => Source -> Term (Syntax Text) (Record fields) -> [DiffInfo]
toInfo source = para $ \ (annotation :< syntax) -> let termName = fromMaybe (textFor source (byteRange annotation)) (identifierFor (termFSource source . runCofree) (Just . tailF . runCofree) syntax) in case syntax of
S.ParseError{} -> [DiffInfo Nothing termName (sourceSpan annotation)]
S.Indexed{} -> foldMap snd syntax
S.Fixed{} -> foldMap snd syntax
S.Commented{} -> foldMap snd syntax
S.AnonymousFunction{} -> [DiffInfo (Just C.AnonymousFunction) termName (sourceSpan annotation)]
_ -> [DiffInfo (Just (category annotation)) termName (sourceSpan annotation)]
identifierFor :: (a -> Text) -> (a -> Maybe (Syntax Text a)) -> Syntax Text (a, b) -> Maybe Text
identifierFor getSource unwrap syntax = case syntax of
S.Function (identifier, _) _ _ -> Just $ getSource identifier
S.Method _ (identifier, _) Nothing _ _ -> Just $ getSource identifier
S.Method _ (identifier, _) (Just (receiver, _)) _ _
| Just (S.Indexed [receiverParams]) <- unwrap receiver
, Just (S.ParameterDecl (Just ty) _) <- unwrap receiverParams -> Just $ "(" <> getSource ty <> ") " <> getSource identifier
| otherwise -> Just $ getSource receiver <> "." <> getSource identifier
_ -> Nothing
diffUnwrap :: Diff f (Record fields) -> Maybe (f (Diff f (Record fields)))
diffUnwrap diff = case runFree diff of
Free (_ :< syntax) -> Just syntax
_ -> Nothing
termFSource :: HasField fields Range => Source -> TermF f (Record fields) a -> Text
termFSource source = toText . flip Source.slice source . byteRange . headF
textFor :: Source -> Range -> Text
textFor source = toText . flip Source.slice source
toJSONSummaries :: TOCSummary DiffInfo -> [JSONSummary]
2017-05-09 18:02:15 +03:00
toJSONSummaries TOCSummary{..} = case infoCategory of
2017-05-09 18:08:18 +03:00
Nothing -> [ErrorSummary infoName infoSpan]
2017-05-09 18:02:15 +03:00
_ -> maybe [] (pure . JSONSummary) parentInfo
where DiffInfo{..} = afterOrBefore summaryPatch
2017-01-23 22:12:05 +03:00
-- The user-facing category name
toCategoryName :: Category -> Text
2017-03-28 22:32:45 +03:00
toCategoryName category = case category of
2017-02-23 07:05:20 +03:00
C.SingletonMethod -> "Method"
c -> show c
instance Listable Declaration where
tiers
= cons1 (MethodDeclaration . unListableText)
\/ cons1 (FunctionDeclaration . unListableText)
\/ cons1 (ErrorDeclaration . unListableText)