We read every piece of feedback, and take your input very seriously.
To see all available qualifiers, see our documentation.
There was an error while loading. Please reload this page.
1 parent f270d6e commit 1967f08Copy full SHA for 1967f08
testsuite/tests/annotations/should_compile/th/annth.hs
@@ -24,5 +24,6 @@ main = do
24
runIO $ print (anns :: [String])
25
anns <- reifyAnnotations (AnnLookupName 'TestTypeTH)
26
27
+ runIO $ hFlush stdout
28
[| return () |] )
29
hFlush stdout
testsuite/tests/simplStg/should_compile/T22840.hs
@@ -6,9 +6,11 @@ module C where
6
import T22840A
7
import T22840B
8
import Control.Monad.IO.Class
9
+import System.IO (hFlush, stdout)
10
11
$(liftIO $ do
12
putStrLn "start"
13
putStrLn (disp theT)
14
putStrLn "end"
15
+ hFlush stdout
16
return [])
0 commit comments