{-# LANGUAGE ImportQualifiedPost #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
module CC
( printIssue
, fromIdea
) where
import Data.Aeson (ToJSON(..), (.=), encode, object)
import Data.Char (toUpper)
import Data.Text (Text)
import Data.Text qualified as T
import Data.ByteString.Lazy.Char8 qualified as C8
import Idea (Idea(..), Severity(..))
import GHC.Types.SrcLoc qualified as GHC
import GHC.Util qualified as GHC
data Issue = Issue
{ Issue -> Text
issueType :: Text
, Issue -> Text
issueCheckName :: Text
, Issue -> Text
issueDescription :: Text
, Issue -> Text
issueContent :: Text
, Issue -> [Text]
issueCategories :: [Text]
, Issue -> Location
issueLocation :: Location
, Issue -> Int
issueRemediationPoints :: Int
}
data Location = Location FilePath Position Position
data Position = Position Int Int
instance ToJSON Issue where
toJSON :: Issue -> Value
toJSON Issue{Int
[Text]
Text
Location
issueType :: Issue -> Text
issueCheckName :: Issue -> Text
issueDescription :: Issue -> Text
issueContent :: Issue -> Text
issueCategories :: Issue -> [Text]
issueLocation :: Issue -> Location
issueRemediationPoints :: Issue -> Int
issueType :: Text
issueCheckName :: Text
issueDescription :: Text
issueContent :: Text
issueCategories :: [Text]
issueLocation :: Location
issueRemediationPoints :: Int
..} = [Pair] -> Value
object
[ Key
"type" Key -> Text -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Text
issueType
, Key
"check_name" Key -> Text -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Text
issueCheckName
, Key
"description" Key -> Text -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Text
issueDescription
, Key
"content" Key -> Value -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= [Pair] -> Value
object
[ Key
"body" Key -> Text -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Text
issueContent
]
, Key
"categories" Key -> [Text] -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= [Text]
issueCategories
, Key
"location" Key -> Location -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Location
issueLocation
, Key
"remediation_points" Key -> Int -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Int
issueRemediationPoints
]
instance ToJSON Location where
toJSON :: Location -> Value
toJSON (Location FilePath
path Position
begin Position
end) = [Pair] -> Value
object
[ Key
"path" Key -> FilePath -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= FilePath
path
, Key
"positions" Key -> Value -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= [Pair] -> Value
object
[ Key
"begin" Key -> Position -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Position
begin
, Key
"end" Key -> Position -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Position
end
]
]
instance ToJSON Position where
toJSON :: Position -> Value
toJSON (Position Int
line Int
column) = [Pair] -> Value
object
[ Key
"line" Key -> Int -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Int
line
, Key
"column" Key -> Int -> Pair
forall v. ToJSON v => Key -> v -> Pair
forall e kv v. (KeyValue e kv, ToJSON v) => Key -> v -> kv
.= Int
column
]
printIssue :: Issue -> IO ()
printIssue :: Issue -> IO ()
printIssue = ByteString -> IO ()
C8.putStrLn (ByteString -> IO ()) -> (Issue -> ByteString) -> Issue -> IO ()
forall b c a. (b -> c) -> (a -> b) -> a -> c
. (ByteString -> ByteString -> ByteString
forall a. Semigroup a => a -> a -> a
<> ByteString
"\0") (ByteString -> ByteString)
-> (Issue -> ByteString) -> Issue -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Issue -> ByteString
forall a. ToJSON a => a -> ByteString
encode
fromIdea :: Idea -> Issue
fromIdea :: Idea -> Issue
fromIdea Idea{FilePath
[FilePath]
[Refactoring SrcSpan]
[Note]
Maybe FilePath
SrcSpan
Severity
ideaModule :: [FilePath]
ideaDecl :: [FilePath]
ideaSeverity :: Severity
ideaHint :: FilePath
ideaSpan :: SrcSpan
ideaFrom :: FilePath
ideaTo :: Maybe FilePath
ideaNote :: [Note]
ideaRefactoring :: [Refactoring SrcSpan]
ideaModule :: Idea -> [FilePath]
ideaDecl :: Idea -> [FilePath]
ideaSeverity :: Idea -> Severity
ideaHint :: Idea -> FilePath
ideaSpan :: Idea -> SrcSpan
ideaFrom :: Idea -> FilePath
ideaTo :: Idea -> Maybe FilePath
ideaNote :: Idea -> [Note]
ideaRefactoring :: Idea -> [Refactoring SrcSpan]
..} = Issue
{ issueType :: Text
issueType = Text
"issue"
, issueCheckName :: Text
issueCheckName = Text
"HLint/" Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> FilePath -> Text
T.pack (FilePath -> FilePath
camelize FilePath
ideaHint)
, issueDescription :: Text
issueDescription = FilePath -> Text
T.pack FilePath
ideaHint
, issueContent :: Text
issueContent = FilePath -> Maybe FilePath -> Text
content FilePath
ideaFrom Maybe FilePath
ideaTo Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<> [Note] -> Text
forall {a}. Show a => [a] -> Text
listNotes [Note]
ideaNote
, issueCategories :: [Text]
issueCategories = FilePath -> [Text]
forall {a} {p}. IsString a => p -> [a]
categories FilePath
ideaHint
, issueLocation :: Location
issueLocation = SrcSpan -> Location
fromSrcSpan SrcSpan
ideaSpan
, issueRemediationPoints :: Int
issueRemediationPoints = Severity -> Int
points Severity
ideaSeverity
}
where
content :: FilePath -> Maybe FilePath -> Text
content FilePath
from Maybe FilePath
Nothing = [Text] -> Text
T.unlines
[ Text
"Found"
, Text
""
, Text
"```"
, FilePath -> Text
T.pack FilePath
from
, Text
"```"
, Text
""
, Text
"remove it."
]
content FilePath
from (Just FilePath
to) = [Text] -> Text
T.unlines
[ Text
"Found"
, Text
""
, Text
"```"
, FilePath -> Text
T.pack FilePath
from
, Text
"```"
, Text
""
, Text
"Perhaps"
, Text
""
, Text
"```"
, FilePath -> Text
T.pack FilePath
to
, Text
"```"
]
listNotes :: [a] -> Text
listNotes [] = Text
""
listNotes [a]
notes = [Text] -> Text
T.unlines ([Text] -> Text) -> [Text] -> Text
forall a b. (a -> b) -> a -> b
$
[ Text
""
, Text
"Applying this change:"
, Text
""
] [Text] -> [Text] -> [Text]
forall a. [a] -> [a] -> [a]
++ (a -> Text) -> [a] -> [Text]
forall a b. (a -> b) -> [a] -> [b]
map ((Text
"* " Text -> Text -> Text
forall a. Semigroup a => a -> a -> a
<>) (Text -> Text) -> (a -> Text) -> a -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> Text
T.pack (FilePath -> Text) -> (a -> FilePath) -> a -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. a -> FilePath
forall a. Show a => a -> FilePath
show) [a]
notes
categories :: p -> [a]
categories p
_ = [a
"Style"]
points :: Severity -> Int
points Severity
Ignore = Int
0
points Severity
Suggestion = Int
basePoints
points Severity
Warning = Int
5 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
basePoints
points Severity
Error = Int
10 Int -> Int -> Int
forall a. Num a => a -> a -> a
* Int
basePoints
fromSrcSpan :: GHC.SrcSpan -> Location
fromSrcSpan :: SrcSpan -> Location
fromSrcSpan GHC.SrcSpan{Int
FilePath
srcSpanFilename :: FilePath
srcSpanStartLine' :: Int
srcSpanStartColumn :: Int
srcSpanEndLine' :: Int
srcSpanEndColumn :: Int
srcSpanFilename :: SrcSpan -> FilePath
srcSpanStartLine' :: SrcSpan -> Int
srcSpanStartColumn :: SrcSpan -> Int
srcSpanEndLine' :: SrcSpan -> Int
srcSpanEndColumn :: SrcSpan -> Int
..} = FilePath -> Position -> Position -> Location
Location
(FilePath -> FilePath
locationFileName FilePath
srcSpanFilename)
(Int -> Int -> Position
Position Int
srcSpanStartLine' Int
srcSpanStartColumn)
(Int -> Int -> Position
Position Int
srcSpanEndLine' Int
srcSpanEndColumn)
where
locationFileName :: FilePath -> FilePath
locationFileName (Char
'.':Char
'/':FilePath
x) = FilePath
x
locationFileName FilePath
x = FilePath
x
camelize :: String -> String
camelize :: FilePath -> FilePath
camelize = (FilePath -> FilePath) -> [FilePath] -> FilePath
forall (t :: * -> *) a b. Foldable t => (a -> [b]) -> t a -> [b]
concatMap FilePath -> FilePath
capitalize ([FilePath] -> FilePath)
-> (FilePath -> [FilePath]) -> FilePath -> FilePath
forall b c a. (b -> c) -> (a -> b) -> a -> c
. FilePath -> [FilePath]
words
capitalize :: String -> String
capitalize :: FilePath -> FilePath
capitalize [] = []
capitalize (Char
c:FilePath
rest) = Char -> Char
toUpper Char
c Char -> FilePath -> FilePath
forall a. a -> [a] -> [a]
: FilePath
rest
basePoints :: Int
basePoints :: Int
basePoints = Int
50000