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

[project @ 1999-07-16 13:34:20 by simonpj]

Add tc101
parent 4a28e396
No related merge requests found
-- !!! Caused ghc-4.04proto to loop!
-- !!! (as reported by Sigbjorn)
module ShouldCompile where
-- This made the compiler (4.04 proto) loop (stack overflow)
-- The bug was in TcUnify.uUnboundVar and is documented there.
type A a = ()
f :: (A a -> a -> ()) -> ()
f = \ _ -> ()
x :: ()
x = f (\ x p -> p x)
ghc: module version changed to 1; reason: no old .hi file
__export ShouldCompile A f x;
1 f :: __forall [a] => (A a -> a -> PrelBase.Z0T) -> PrelBase.Z0T ;
1 type A a = PrelBase.Z0T ;
1 x :: PrelBase.Z0T ;
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