Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC

Commits:

2 changed files:

Changes:

  • testsuite/tests/typecheck/should_compile/T17705.hs
    1
    +{-# LANGUAGE TypeAbstractions #-}
    
    2
    +
    
    3
    +module T17705 where
    
    4
    +
    
    5
    +import Data.Kind
    
    6
    +
    
    7
    +type F :: forall a (b :: a -> Type). a -> Type
    
    8
    +type F @_ @f x = f x
    
    9
    +
    
    10
    +type G :: forall a. forall (b :: a -> Type) -> a -> Type
    
    11
    +type G @_ f x = f x
    
    12
    +
    
    13
    +type H :: forall a (f :: a -> a -> Type). a -> a -> Type
    
    14
    +type H @_ @f a b = f a b
    
    15
    +

  • testsuite/tests/typecheck/should_compile/all.T
    ... ... @@ -953,3 +953,4 @@ test('T26358', expect_broken(26358), compile, [''])
    953 953
     test('T26345', normal, compile, [''])
    
    954 954
     test('T26376', normal, compile, [''])
    
    955 955
     test('T26457', normal, compile, [''])
    
    956
    +test('T17705', normal, compile, [''])