Skip to content
Snippets Groups Projects
Commit ab472001 authored by Simon Peyton Jones's avatar Simon Peyton Jones
Browse files

Test Trac #7321

parent b4166fdd
No related merge requests found
......@@ -11,6 +11,11 @@ gadt17:
'$(TEST_HC)' $(TEST_HC_OPTS) -c Gadt17_help.hs
'$(TEST_HC)' $(TEST_HC_OPTS) -c gadt17.hs
T7321:
@$(RM) T7321a.hi T7321.hi
'$(TEST_HC)' $(TEST_HC_OPTS) -c T7321a.hs
'$(TEST_HC)' $(TEST_HC_OPTS) -c T7321.hs
gadt23:
$(RM) gadt23 gadt23.hi gadt23.o Gadt23_AST.hi Gadt23_AST.o
'$(TEST_HC)' $(TEST_HC_OPTS) -v0 --make gadt23.hs
......
module T7321 where
import T7321a
foo :: Exp a
foo = error "urk"
{-# LANGUAGE GADTs #-}
module T7321a where
data Exp a where
LamE :: (Exp a -> Exp b) -> Exp (Exp a -> Exp b)
......@@ -116,3 +116,7 @@ test('FloatEq', normal, compile, [''])
test('T7205', normal, compile, [''])
test('T7293', normal, compile_fail, [''])
test('T7294', normal, compile, [''])
test('T7321',
extra_clean(['T7321a.hi', 'T7321a.o']),
run_command,
['$MAKE -s --no-print-directory T7321'])
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