Skip to content

Commit 1967f08

Browse files
committed
testsuite: Add explicit flushs [WRONG!]
This seems conceptually wrong. I don't fully understand why we need this?
1 parent f270d6e commit 1967f08

File tree

2 files changed

+3
-0
lines changed

2 files changed

+3
-0
lines changed

testsuite/tests/annotations/should_compile/th/annth.hs

Lines changed: 1 addition & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -24,5 +24,6 @@ main = do
2424
runIO $ print (anns :: [String])
2525
anns <- reifyAnnotations (AnnLookupName 'TestTypeTH)
2626
runIO $ print (anns :: [String])
27+
runIO $ hFlush stdout
2728
[| return () |] )
2829
hFlush stdout

testsuite/tests/simplStg/should_compile/T22840.hs

Lines changed: 2 additions & 0 deletions
Original file line numberDiff line numberDiff line change
@@ -6,9 +6,11 @@ module C where
66
import T22840A
77
import T22840B
88
import Control.Monad.IO.Class
9+
import System.IO (hFlush, stdout)
910

1011
$(liftIO $ do
1112
putStrLn "start"
1213
putStrLn (disp theT)
1314
putStrLn "end"
15+
hFlush stdout
1416
return [])

0 commit comments

Comments
 (0)