diff --git a/html-test/src/Instances.hs b/html-test/src/Instances.hs
index d0d68dc354bd077cbabd0fb477caac0e3ac78c63..8e237fe779615bd3d1cf7ecd09e9d5112e5722b0 100644
--- a/html-test/src/Instances.hs
+++ b/html-test/src/Instances.hs
@@ -1,6 +1,7 @@
 {-# LANGUAGE MultiParamTypeClasses #-}
 {-# LANGUAGE FlexibleInstances #-}
 {-# LANGUAGE FlexibleContexts #-}
+{-# LANGUAGE ImpredicativeTypes #-}
 
 
 module Instances where
@@ -34,3 +35,20 @@ instance Bar Maybe [a]
 instance Bar [] (a, a)
 instance Foo f => Bar (Either a) (f a)
 instance Foo ((,,) a b) => Bar ((,,) a b) (a, b, a)
+
+
+class Baz a where
+
+	baz :: a -> (forall a. a -> a) -> (b, forall c. c -> a) -> (b, c)
+	baz' :: b -> (forall b. b -> a) -> (forall b. b -> a) -> [(b, a)]
+	baz'' :: b -> (forall b. (forall b. b -> a) -> c) -> (forall c. c -> b)
+
+	baz = undefined
+	baz' = undefined
+	baz'' = undefined
+
+
+instance Baz (a -> b)
+instance Baz [c]
+instance Baz (a, b, c)
+instance Baz (a, [b], b, a)