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

Test Trac #12885

...which is fixed by

  commit 0476a64e
  Author: Simon Peyton Jones <simonpj@microsoft.com>
  Date:   Tue Oct 25 15:22:17 2016 +0100

    Fix a bug in mk_superclasses_of
parent 605af54a
No related branches found
No related tags found
No related merge requests found
{-# LANGUAGE TypeFamilies, ConstraintKinds #-}
module Foo where
import GHC.Exts
f :: F [a] => a -> Bool
f x = x == x
type family F a :: Constraint
type instance F [a] = (Show a, (Show a, (Show a, (Show a, (Show a,
Show a, (Show a, (Show a, (Show a, (Show a, Eq a)))))))))
......@@ -155,3 +155,4 @@ test('T12593', normal, compile_fail, [''])
test('T12668', normal, compile, [''])
test('T12718', normal, compile, [''])
test('T12444', normal, compile_fail, [''])
test('T12885', 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