{-
    This empty file is provided for ease of patching in site specific checks.
    However, there are no guarantees regarding compatibility between versions.
-} 

{-# LANGUAGE TemplateHaskell #-}
module ShellCheck.Checks.Custom (checker, ShellCheck.Checks.Custom.runTests) where

import ShellCheck.AnalyzerLib
import Test.QuickCheck

checker :: Parameters -> Checker
checker :: Parameters -> Checker
checker Parameters
params = Checker {
    perScript :: Root -> Analysis
perScript = forall a b. a -> b -> a
const forall a b. (a -> b) -> a -> b
$ forall (m :: * -> *) a. Monad m => a -> m a
return (),
    perToken :: Token -> Analysis
perToken = forall a b. a -> b -> a
const forall a b. (a -> b) -> a -> b
$ forall (m :: * -> *) a. Monad m => a -> m a
return ()
  }

prop_CustomTestsWork :: Bool
prop_CustomTestsWork = Bool
True

return []
runTests :: IO Bool
runTests = $Bool
String
[(String, Property)]
[(String, Property)] -> (Property -> IO Result) -> IO Bool
forall prop. Testable prop => prop -> IO Result
forall prop. Testable prop => prop -> Property
runQuickCheckAll :: [(String, Property)] -> (Property -> IO Result) -> IO Bool
property :: forall prop. Testable prop => prop -> Property
quickCheckResult :: forall prop. Testable prop => prop -> IO Result
prop_CustomTestsWork :: Bool
quickCheckAll