2021-10-27 13:04:49 +00:00
|
|
|
{-# LANGUAGE CPP #-}
|
|
|
|
{-# LANGUAGE DataKinds #-}
|
|
|
|
{-# LANGUAGE DuplicateRecordFields #-}
|
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
|
|
|
{-# LANGUAGE TypeApplications #-}
|
|
|
|
|
|
|
|
|
|
|
|
module Main where
|
|
|
|
|
|
|
|
import GHCup.Types
|
|
|
|
import GHCup.Errors
|
|
|
|
import GHCup.Platform
|
|
|
|
import GHCup.Utils.Dirs
|
|
|
|
import GHCup.Utils.Logger
|
|
|
|
import GHCup.Types.JSON ( )
|
|
|
|
|
|
|
|
import Control.Exception ( displayException )
|
|
|
|
import Control.Monad.Trans.Reader ( runReaderT )
|
|
|
|
import Control.Monad.IO.Class
|
|
|
|
import Data.Char ( toLower )
|
|
|
|
import Data.Maybe
|
|
|
|
#if !MIN_VERSION_base(4,13,0)
|
|
|
|
import Data.Semigroup ( (<>) )
|
|
|
|
#endif
|
|
|
|
import Options.Applicative hiding ( style )
|
|
|
|
import Haskus.Utils.Variant.Excepts
|
|
|
|
import System.Console.Pretty
|
|
|
|
import System.Environment
|
|
|
|
import System.Exit
|
|
|
|
import System.IO ( stderr )
|
|
|
|
import Text.Regex.Posix
|
|
|
|
import Validate
|
|
|
|
import Text.PrettyPrint.HughesPJClass ( prettyShow )
|
|
|
|
|
|
|
|
import qualified Data.Text.IO as T
|
|
|
|
import qualified Data.Text as T
|
|
|
|
import qualified Data.ByteString as B
|
|
|
|
import qualified Data.Yaml.Aeson as Y
|
|
|
|
|
|
|
|
|
|
|
|
data Options = Options
|
|
|
|
{ optCommand :: Command
|
|
|
|
}
|
|
|
|
|
|
|
|
data Command = ValidateYAML ValidateYAMLOpts
|
|
|
|
| ValidateTarballs ValidateYAMLOpts TarballFilter
|
|
|
|
|
|
|
|
|
|
|
|
data Input
|
|
|
|
= FileInput FilePath -- optsparse-applicative doesn't handle ByteString correctly anyway
|
|
|
|
| StdInput
|
|
|
|
|
|
|
|
fileInput :: Parser Input
|
|
|
|
fileInput =
|
|
|
|
FileInput
|
|
|
|
<$> strOption
|
|
|
|
(long "file" <> short 'f' <> metavar "FILENAME" <> help
|
|
|
|
"Input file to validate"
|
|
|
|
)
|
|
|
|
|
|
|
|
stdInput :: Parser Input
|
|
|
|
stdInput = flag'
|
|
|
|
StdInput
|
|
|
|
(short 'i' <> long "stdin" <> help "Validate from stdin (default)")
|
|
|
|
|
|
|
|
inputP :: Parser Input
|
|
|
|
inputP = fileInput <|> stdInput
|
|
|
|
|
|
|
|
data ValidateYAMLOpts = ValidateYAMLOpts
|
|
|
|
{ vInput :: Maybe Input
|
|
|
|
}
|
|
|
|
|
|
|
|
validateYAMLOpts :: Parser ValidateYAMLOpts
|
|
|
|
validateYAMLOpts = ValidateYAMLOpts <$> optional inputP
|
|
|
|
|
|
|
|
tarballFilterP :: Parser TarballFilter
|
|
|
|
tarballFilterP = option readm $
|
|
|
|
long "tarball-filter" <> short 'u' <> metavar "<tool>-<version>" <> value def
|
|
|
|
<> help "Only check certain tarballs (format: <tool>-<version>)"
|
|
|
|
where
|
|
|
|
def = TarballFilter (Right Nothing) (makeRegex ("" :: String))
|
|
|
|
readm = do
|
|
|
|
s <- str
|
|
|
|
case span (/= '-') s of
|
|
|
|
(_, []) -> fail "invalid format, missing '-' after the tool name"
|
|
|
|
(t, v) | [tool] <- [ tool | tool <- [minBound..maxBound], low (show tool) == low t ] ->
|
|
|
|
pure (TarballFilter $ Right $ Just tool) <*> makeRegexOptsM compIgnoreCase execBlank (drop 1 v)
|
|
|
|
(t, v) | [tool] <- [ tool | tool <- [minBound..maxBound], low (show tool) == low t ] ->
|
|
|
|
pure (TarballFilter $ Left tool) <*> makeRegexOptsM compIgnoreCase execBlank (drop 1 v)
|
|
|
|
_ -> fail "invalid tool"
|
|
|
|
low = fmap toLower
|
|
|
|
|
|
|
|
|
|
|
|
opts :: Parser Options
|
|
|
|
opts = Options <$> com
|
|
|
|
|
|
|
|
com :: Parser Command
|
|
|
|
com = subparser
|
|
|
|
( command
|
|
|
|
"check"
|
|
|
|
( ValidateYAML
|
|
|
|
<$> info (validateYAMLOpts <**> helper)
|
|
|
|
(progDesc "Validate the YAML")
|
|
|
|
)
|
|
|
|
<> command
|
|
|
|
"check-tarballs"
|
|
|
|
(info
|
|
|
|
((ValidateTarballs <$> validateYAMLOpts <*> tarballFilterP) <**> helper)
|
|
|
|
(progDesc "Validate all tarballs (download and checksum)")
|
|
|
|
)
|
|
|
|
)
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
|
main :: IO ()
|
|
|
|
main = do
|
|
|
|
no_color <- isJust <$> lookupEnv "NO_COLOR"
|
|
|
|
let loggerConfig = LoggerConfig { lcPrintDebug = True
|
|
|
|
, consoleOutter = T.hPutStr stderr
|
|
|
|
, fileOutter = \_ -> pure ()
|
|
|
|
, fancyColors = not no_color
|
|
|
|
}
|
|
|
|
dirs <- liftIO getAllDirs
|
2021-11-13 20:21:19 +00:00
|
|
|
let leanAppstate = LeanAppState (Settings True 0 False Never Curl True GHCupURL False GPGNone False) dirs defaultKeyBindings loggerConfig
|
2021-10-27 13:04:49 +00:00
|
|
|
|
|
|
|
pfreq <- (
|
|
|
|
flip runReaderT leanAppstate . runE @'[NoCompatiblePlatform, NoCompatibleArch, DistroNotFound] $ platformRequest
|
|
|
|
) >>= \case
|
|
|
|
VRight r -> pure r
|
|
|
|
VLeft e -> do
|
|
|
|
flip runReaderT leanAppstate $ logError $ T.pack $ prettyShow e
|
|
|
|
liftIO $ exitWith (ExitFailure 2)
|
|
|
|
|
2021-11-13 20:21:19 +00:00
|
|
|
let appstate = AppState (Settings True 0 False Never Curl True GHCupURL False GPGNone False) dirs defaultKeyBindings (GHCupInfo mempty mempty mempty) pfreq loggerConfig
|
2021-10-27 13:04:49 +00:00
|
|
|
|
|
|
|
_ <- customExecParser (prefs showHelpOnError) (info (opts <**> helper) idm)
|
|
|
|
>>= \Options {..} -> case optCommand of
|
|
|
|
ValidateYAML vopts -> withValidateYamlOpts vopts (\dl m -> flip runReaderT appstate $ validate dl m)
|
|
|
|
ValidateTarballs vopts tarballFilter -> withValidateYamlOpts vopts (\dl m -> flip runReaderT appstate $ validateTarballs tarballFilter dl m)
|
|
|
|
pure ()
|
|
|
|
|
|
|
|
where
|
|
|
|
withValidateYamlOpts vopts f = case vopts of
|
|
|
|
ValidateYAMLOpts { vInput = Nothing } ->
|
|
|
|
B.getContents >>= valAndExit f
|
|
|
|
ValidateYAMLOpts { vInput = Just StdInput } ->
|
|
|
|
B.getContents >>= valAndExit f
|
|
|
|
ValidateYAMLOpts { vInput = Just (FileInput file) } ->
|
|
|
|
B.readFile file >>= valAndExit f
|
|
|
|
valAndExit f contents = do
|
|
|
|
(GHCupInfo _ av gt) <- case Y.decodeEither' contents of
|
|
|
|
Right r -> pure r
|
|
|
|
Left e -> die (color Red $ displayException e)
|
|
|
|
f av gt
|
|
|
|
>>= exitWith
|