[Git][ghc/ghc][wip/top-level-kind-signatures] T16731 test case (broken)

Vladislav Zavialov gitlab at gitlab.haskell.org
Wed Jun 5 10:14:36 UTC 2019



Vladislav Zavialov pushed to branch wip/top-level-kind-signatures at Glasgow Haskell Compiler / GHC


Commits:
9096c4fb by Vladislav Zavialov at 2019-06-02T21:17:12Z
T16731 test case (broken)

- - - - -


2 changed files:

- + testsuite/tests/tlks/should_compile/T16731.hs
- testsuite/tests/tlks/should_compile/all.T


Changes:

=====================================
testsuite/tests/tlks/should_compile/T16731.hs
=====================================
@@ -0,0 +1,14 @@
+{-# LANGUAGE TopLevelKindSignatures #-}
+{-# LANGUAGE DeriveAnyClass #-}
+{-# LANGUAGE MultiParamTypeClasses #-}
+{-# LANGUAGE PolyKinds #-}
+{-# LANGUAGE ScopedTypeVariables #-}
+
+module T16731 where
+
+import Data.Kind
+
+class C (a :: Type) (b :: Type)
+
+type T :: forall a. a -> Type
+data T (x :: z) deriving (C z)


=====================================
testsuite/tests/tlks/should_compile/all.T
=====================================
@@ -33,3 +33,4 @@ test('tlks030', normal, compile, [''])
 test('T16723', normal, compile, [''])
 test('T16724', extra_files(['T16724.hs']), ghci_script, ['T16724.script'])
 test('T16726', normal, compile, [''])
+test('T16731', normal, compile, [''])



View it on GitLab: https://gitlab.haskell.org/ghc/ghc/commit/9096c4fbd640a967d4e579072afa4fdb0c2f3381

-- 
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/commit/9096c4fbd640a967d4e579072afa4fdb0c2f3381
You're receiving this email because of your account on gitlab.haskell.org.


-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20190605/5c1a5157/attachment.html>


More information about the ghc-commits mailing list