1
1
mirror of https://github.com/anoma/juvix.git synced 2024-12-17 11:51:42 +03:00
juvix/app/Commands/Format.hs
Veronika Romashkina 8e59624ff5
Format returns 0 when file is not formatted (#2181)
`format` command now returns code `0` most of the time.

It will return `1` when:
* some error occur, so can not format
* file is unformatted and `--check` option is used
* One or more files are not formatted in a Juvix project.

- Fixes #2171
2023-06-07 13:53:10 +02:00

95 lines
3.3 KiB
Haskell

module Commands.Format where
import Commands.Base
import Commands.Format.Options
import Data.Text qualified as Text
import Juvix.Formatter
import Juvix.Prelude.Pretty
data FormatNoEditRenderMode
= ReformattedFile (NonEmpty AnsiText)
| InputPath (Path Abs File)
| Silent
data FormatRenderMode
= EditInPlace FormattedFileInfo
| NoEdit FormatNoEditRenderMode
data FormatTarget
= TargetFile
| TargetDir
| TargetStdin
deriving stock (Eq)
runCommand :: forall r. Members '[Embed IO, App, Resource, Files] r => FormatOptions -> Sem r ()
runCommand opts = do
globalOpts <- askGlobalOptions
let isStdin = globalOpts ^. globalStdin
f <- mapM filePathToAbs (opts ^. formatInput)
let target = case f of
Just Left {} -> TargetFile
Just Right {} -> TargetDir
Nothing -> TargetStdin
runOutputSem (renderFormattedOutput target opts) $ runScopeFileApp $ do
res <- case f of
Just (Left p) -> format p
Just (Right p) -> formatProject p
Nothing ->
if
| isStdin -> formatStdin
| otherwise -> do
printFailureExit $
Text.unlines
[ "juvix format error: either 'JUVIX_FILE_OR_PROJECT' or '--stdin' option must be specified",
"Use the --help option to display more usage information."
]
return FormatResultFail
let exitFail :: IO a
exitFail = exitWith (ExitFailure 1)
case res of
FormatResultFail -> embed exitFail
FormatResultNotFormatted ->
{- use exit code 1 for
* unformatted files when using --check
* when running the formatter on a Juvix project
-}
when (opts ^. formatCheck || target == TargetDir) (embed exitFail)
FormatResultOK -> pure ()
renderModeFromOptions :: FormatTarget -> FormatOptions -> FormattedFileInfo -> FormatRenderMode
renderModeFromOptions target opts formattedInfo
| opts ^. formatInPlace = EditInPlace formattedInfo
| opts ^. formatCheck = NoEdit Silent
| otherwise = case target of
TargetFile -> NoEdit (ReformattedFile (formattedInfo ^. formattedFileInfoContentsAnsi))
TargetDir -> NoEdit (InputPath (formattedInfo ^. formattedFileInfoPath))
TargetStdin -> NoEdit (ReformattedFile (formattedInfo ^. formattedFileInfoContentsAnsi))
renderFormattedOutput :: forall r. Members '[Embed IO, App, Resource, Files] r => FormatTarget -> FormatOptions -> FormattedFileInfo -> Sem r ()
renderFormattedOutput target opts fInfo = do
let renderMode = renderModeFromOptions target opts fInfo
outputResult renderMode
where
outputResult :: FormatRenderMode -> Sem r ()
outputResult = \case
EditInPlace i@FormattedFileInfo {..} ->
runTempFileIO $
restoreFileOnError _formattedFileInfoPath $
writeFile' _formattedFileInfoPath (i ^. formattedFileInfoContentsText)
NoEdit m -> case m of
ReformattedFile ts -> forM_ ts renderStdOut
InputPath p -> say (pack (toFilePath p))
Silent -> return ()
runScopeFileApp :: Member App r => Sem (ScopeEff ': r) a -> Sem r a
runScopeFileApp = interpret $ \case
ScopeFile p -> do
let appFile =
AppPath
{ _pathPath = mkPrepath (toFilePath p),
_pathIsInput = False
}
runPipeline appFile upToScoping
ScopeStdin -> runPipelineNoFile upToScoping