Strip lines containing "STRIP" from ./striptests
This commit is contained in:
parent
b044f5b23a
commit
e7df718724
|
@ -42,7 +42,7 @@ import Data.List
|
||||||
import Data.Maybe
|
import Data.Maybe
|
||||||
import Data.Ord
|
import Data.Ord
|
||||||
import Data.Semigroup
|
import Data.Semigroup
|
||||||
import Debug.Trace
|
import Debug.Trace -- STRIP
|
||||||
import qualified Data.Map.Strict as Map
|
import qualified Data.Map.Strict as Map
|
||||||
import Test.QuickCheck.All (forAllProperties)
|
import Test.QuickCheck.All (forAllProperties)
|
||||||
import Test.QuickCheck.Test (quickCheckWithResult, stdArgs, maxSuccess)
|
import Test.QuickCheck.Test (quickCheckWithResult, stdArgs, maxSuccess)
|
||||||
|
@ -1011,8 +1011,8 @@ checkStderrRedirect params redir@(T_Redirecting _ [
|
||||||
|
|
||||||
checkStderrRedirect _ _ = return ()
|
checkStderrRedirect _ _ = return ()
|
||||||
|
|
||||||
lt x = trace ("Tracing " ++ show x) x
|
lt x = trace ("Tracing " ++ show x) x -- STRIP
|
||||||
ltt t = trace ("Tracing " ++ show t)
|
ltt t = trace ("Tracing " ++ show t) -- STRIP
|
||||||
|
|
||||||
|
|
||||||
prop_checkSingleQuotedVariables = verify checkSingleQuotedVariables "echo '$foo'"
|
prop_checkSingleQuotedVariables = verify checkSingleQuotedVariables "echo '$foo'"
|
||||||
|
|
|
@ -38,9 +38,6 @@ import System.FilePath
|
||||||
|
|
||||||
import Test.QuickCheck
|
import Test.QuickCheck
|
||||||
|
|
||||||
import Debug.Trace
|
|
||||||
ltt x = trace (show x) x
|
|
||||||
|
|
||||||
format :: FormatterOptions -> IO Formatter
|
format :: FormatterOptions -> IO Formatter
|
||||||
format options = do
|
format options = do
|
||||||
foundIssues <- newIORef False
|
foundIssues <- newIORef False
|
||||||
|
|
|
@ -37,7 +37,7 @@ import Data.Functor
|
||||||
import Data.List (isPrefixOf, isInfixOf, isSuffixOf, partition, sortBy, intercalate, nub, find)
|
import Data.List (isPrefixOf, isInfixOf, isSuffixOf, partition, sortBy, intercalate, nub, find)
|
||||||
import Data.Maybe
|
import Data.Maybe
|
||||||
import Data.Monoid
|
import Data.Monoid
|
||||||
import Debug.Trace
|
import Debug.Trace -- STRIP
|
||||||
import GHC.Exts (sortWith)
|
import GHC.Exts (sortWith)
|
||||||
import Prelude hiding (readList)
|
import Prelude hiding (readList)
|
||||||
import System.IO
|
import System.IO
|
||||||
|
@ -3372,13 +3372,13 @@ parsesCleanly parser string = runIdentity $ do
|
||||||
|
|
||||||
-- For printf debugging: print the value of an expression
|
-- For printf debugging: print the value of an expression
|
||||||
-- Example: return $ dump $ T_Literal id [c]
|
-- Example: return $ dump $ T_Literal id [c]
|
||||||
dump :: Show a => a -> a
|
dump :: Show a => a -> a -- STRIP
|
||||||
dump x = trace (show x) x
|
dump x = trace (show x) x -- STRIP
|
||||||
|
|
||||||
-- Like above, but print a specific expression:
|
-- Like above, but print a specific expression:
|
||||||
-- Example: return $ dumps ("Returning: " ++ [c]) $ T_Literal id [c]
|
-- Example: return $ dumps ("Returning: " ++ [c]) $ T_Literal id [c]
|
||||||
dumps :: Show x => x -> a -> a
|
dumps :: Show x => x -> a -> a -- STRIP
|
||||||
dumps t = trace (show t)
|
dumps t = trace (show t) -- STRIP
|
||||||
|
|
||||||
parseWithNotes parser = do
|
parseWithNotes parser = do
|
||||||
item <- parser
|
item <- parser
|
||||||
|
|
|
@ -29,6 +29,7 @@ detestify() {
|
||||||
state = 0;
|
state = 0;
|
||||||
}
|
}
|
||||||
|
|
||||||
|
/STRIP/ { next; }
|
||||||
/LANGUAGE TemplateHaskell/ { next; }
|
/LANGUAGE TemplateHaskell/ { next; }
|
||||||
/^import.*Test\./ { next; }
|
/^import.*Test\./ { next; }
|
||||||
|
|
||||||
|
|
Loading…
Reference in New Issue