summaryrefslogtreecommitdiff
path: root/testsuite/tests/parser/should_compile/DumpRenamedAst.hs
diff options
context:
space:
mode:
Diffstat (limited to 'testsuite/tests/parser/should_compile/DumpRenamedAst.hs')
-rw-r--r--testsuite/tests/parser/should_compile/DumpRenamedAst.hs8
1 files changed, 7 insertions, 1 deletions
diff --git a/testsuite/tests/parser/should_compile/DumpRenamedAst.hs b/testsuite/tests/parser/should_compile/DumpRenamedAst.hs
index c617febd40..d5be8627be 100644
--- a/testsuite/tests/parser/should_compile/DumpRenamedAst.hs
+++ b/testsuite/tests/parser/should_compile/DumpRenamedAst.hs
@@ -1,7 +1,8 @@
{-# LANGUAGE DataKinds, GADTs, PolyKinds, RankNTypes, TypeOperators,
- TypeFamilies #-}
+ TypeFamilies, StarIsType, TypeApplications #-}
module DumpRenamedAst where
+import Data.Kind
import Data.Kind (Type)
@@ -17,4 +18,9 @@ data family Nat :: k -> k -> Type
newtype instance Nat (a :: k -> Type) :: (k -> Type) -> Type where
Nat :: (forall xx. f xx -> g xx) -> Nat f g
+data T f (a :: k) = MkT (f a)
+
+type family F1 (a :: k) (f :: k -> Type) :: Type where
+ F1 @Peano a f = T @Peano f a
+
main = putStrLn "hello"