Skip to content
Snippets Groups Projects
Commit c6c3fb6c authored by Richard Eisenberg's avatar Richard Eisenberg Committed by Austin Seipp
Browse files

Test #7481, which had already been fixed.

(cherry picked from commit d1dff94c)
parent d99fcc16
No related merge requests found
{-# LANGUAGE DataKinds, PolyKinds, RankNTypes, GADTs #-}
module T7481 where
import Data.Proxy
data D a where
D1 :: a -> D a
D2 :: (a~Int) => D a
D3 :: forall (a::k) b. Proxy a -> D b
data Foo :: D * -> *
\ No newline at end of file
T7481.hs:12:13:
‛D’ of kind ‛* -> *’ is not promotable
In the kind ‛D * -> *’
......@@ -97,3 +97,4 @@ test('T8534', normal, compile, [''])
test('T8566', normal, compile_fail,[''])
test('T8616', normal, compile_fail,[''])
test('T8566a', expect_broken(8566), compile,[''])
test('T7481', normal, compile_fail,[''])
\ No newline at end of file
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