Skip to content
Snippets Groups Projects
Commit df409de9 authored by Joachim Breitner's avatar Joachim Breitner
Browse files

Flush after TH in #8884 test case

(I recall that this was needed in some cases in the past, and might fix
the validate error on travis.)
parent a6939ec2
No related branches found
No related tags found
No related merge requests found
......@@ -3,6 +3,7 @@
module T8884 where
import Language.Haskell.TH
import System.IO
type family Foo a where
Foo x = x
......@@ -16,6 +17,7 @@ $( do FamilyI foo@(ClosedTypeFamilyD _ tvbs1 m_kind1 eqns1) [] <- reify ''Foo
runIO $ putStrLn $ pprint foo
runIO $ putStrLn $ pprint baz
runIO $ putStrLn $ pprint inst
runIO $ hFlush stdout
return [ ClosedTypeFamilyD (mkName "Foo'") tvbs1 m_kind1 eqns1
, FamilyD TypeFam (mkName "Baz'") tvbs2 m_kind2
, TySynInstD (mkName "Baz'") eqn2 ] )
\ No newline at end of file
, TySynInstD (mkName "Baz'") eqn2 ] )
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment