blob: 6ac02aff34195134ef09f8ce834d3a7f887f6dc4 [file] [log] [blame]
module Main where
import Control.Monad
import System.Exit
import qualified ShellCheck.Checker
import qualified ShellCheck.Analytics
import qualified ShellCheck.Parser
main = do
putStrLn "Running ShellCheck tests..."
results <- sequence [
ShellCheck.Checker.runTests,
ShellCheck.Analytics.runTests,
ShellCheck.Parser.runTests
]
if and results
then exitSuccess
else exitFailure