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

Test Trac #8856

parent cf1a0f97
No related merge requests found
{-# LANGUAGE ScopedTypeVariables, RankNTypes, PolyKinds #-}
module T8856 where
import Data.Proxy
foo = (undefined :: Proxy a) :: forall a. Proxy a
...@@ -417,3 +417,4 @@ test('T8565', normal, compile, ['']) ...@@ -417,3 +417,4 @@ test('T8565', normal, compile, [''])
test('T8644', normal, compile, ['']) test('T8644', normal, compile, [''])
test('T8762', normal, compile, ['']) test('T8762', normal, compile, [''])
test('MutRec', normal, compile, ['']) test('MutRec', normal, compile, [''])
test('T8856', normal, compile, [''])
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