1 {-# LANGUAGE RankNTypes, KindSignatures #-}
2 {-# OPTIONS_GHC -Werror #-}
6 module ShouldFail
where
8 data D
(f
:: (* -> *) -> * -> *) (af
:: * -> *) (ax
:: *) =
11 data CList
(f
:: (* -> *) -> * -> *) (a
:: *) =
12 RCons a
(CList
(D f
) a
)
14 type CycleList a
= forall f
. CList f a
16 chead
:: CycleList a
-> a
17 chead ys
= case ys
of (RCons x xs
) -> x