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

Make tcrun042 fail

This test uses wholesale impredicative polymorphism, and now fails.
That's ok.
parent 5d473cd6
No related branches found
No related tags found
No related merge requests found
......@@ -62,7 +62,7 @@ test('tcrun038',
test('tcrun039', normal, compile_and_run, [''])
test('tcrun040', normal, compile_and_run, [''])
test('tcrun041', omit_ways(['ghci']), compile_and_run, [''])
test('tcrun042', normal, compile_and_run, [''])
test('tcrun042', normal, compile_fail, [''])
test('tcrun043', normal, compile_and_run, [''])
test('tcrun044', normal, compile_and_run, [''])
test('tcrun045', normal, compile_fail, [''])
......
{-# LANGUAGE TupleSections, RankNTypes, ImpredicativeTypes #-}
-- Sept 16: This test involves wholesale use of impredicative polymorhism
-- and I'm amazed it has worked for so long. Anyway it is now
-- failing, which is OK. We don't really suport impredicative
-- polymorphism!
--
-- The test was added by Max in 5e8ff849, appretly to test tuple sections
module Main where
e :: a -> (forall b. b -> b -> b) -> (a, String, forall c. c -> c -> c)
......
tcrun042.hs:13:5: error:
• Couldn't match expected type ‘forall c. c -> c -> c’
with actual type ‘b0 -> b0 -> b0’
• In the expression: (, "Hello" ++ "World",)
In an equation for ‘e’: e = (, "Hello" ++ "World",)
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