[commit: ghc] ghc-7.10: Flush stdout in test case for #10596 (eea6557)

git at git.haskell.org git at git.haskell.org
Tue Sep 29 16:10:15 UTC 2015


Repository : ssh://git@git.haskell.org/ghc

On branch  : ghc-7.10
Link       : http://ghc.haskell.org/trac/ghc/changeset/eea6557769f6c805f6cd1772b86cbd2d62459cec/ghc

>---------------------------------------------------------------

commit eea6557769f6c805f6cd1772b86cbd2d62459cec
Author: Joachim Breitner <mail at joachim-breitner.de>
Date:   Wed Jul 15 10:29:26 2015 +0200

    Flush stdout in test case for #10596
    
    which might help, as it has helped with lots of other TH-related test
    cases in the past.


>---------------------------------------------------------------

eea6557769f6c805f6cd1772b86cbd2d62459cec
 testsuite/tests/th/T10596.hs | 3 +++
 1 file changed, 3 insertions(+)

diff --git a/testsuite/tests/th/T10596.hs b/testsuite/tests/th/T10596.hs
index c861156..35d59e9 100644
--- a/testsuite/tests/th/T10596.hs
+++ b/testsuite/tests/th/T10596.hs
@@ -2,10 +2,13 @@
 module T10596 where
 import Language.Haskell.TH
 import Language.Haskell.TH.Syntax
+import System.IO
+
 do
   putQ (100 :: Int)
   x <- (getQ :: Q (Maybe Int))
 
   -- It should print "Just 100"
   runIO $ print x
+  runIO $ hFlush stdout
   return []



More information about the ghc-commits mailing list