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

Test Trac #5424

parent 06127a28
No related merge requests found
{-# LANGUAGE GADTs #-}
{-# OPTIONS_GHC -Wall #-}
module W where
import T5424a
data D a where
C1 :: D X
C2 :: D Y
f :: D X -> Int
f C1 = 1
module T5424a where
data X
data Y
......@@ -107,4 +107,4 @@ test('gadtSyntaxFail001', if_compiler_lt('ghc', '7.1', expect_fail), compile_fai
test('gadtSyntaxFail002', if_compiler_lt('ghc', '7.1', expect_fail), compile_fail, [''])
test('gadtSyntaxFail003', if_compiler_lt('ghc', '7.1', expect_fail), compile_fail, [''])
test('T3169', normal, compile_fail, [''])
test('T5424', normal, multimod_compile, ['T5424', '-v0 -O0'])
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