mirror of
https://github.com/koalaman/shellcheck.git
synced 2025-03-12 12:35:25 -07:00
Please run using "cabal test --show-details=streaming", there's a known issue about this that was fixed in the latest version of cabal: https://github.com/haskell/cabal/issues/1810
17 lines
442 B
Haskell
17 lines
442 B
Haskell
module Main where
|
|
|
|
import Control.Monad
|
|
import System.Exit
|
|
import qualified ShellCheck.Simple
|
|
import qualified ShellCheck.Analytics
|
|
import qualified ShellCheck.Parser
|
|
|
|
main = do
|
|
putStrLn "Running ShellCheck tests..."
|
|
results <- sequence [ShellCheck.Simple.runTests,
|
|
ShellCheck.Analytics.runTests,
|
|
ShellCheck.Parser.runTests]
|
|
if and results then exitSuccess
|
|
else exitFailure
|
|
|