summaryrefslogtreecommitdiff
path: root/ghc/compiler/tests/printing/Print001.hs
diff options
context:
space:
mode:
Diffstat (limited to 'ghc/compiler/tests/printing/Print001.hs')
-rw-r--r--ghc/compiler/tests/printing/Print001.hs18
1 files changed, 18 insertions, 0 deletions
diff --git a/ghc/compiler/tests/printing/Print001.hs b/ghc/compiler/tests/printing/Print001.hs
new file mode 100644
index 0000000000..efe63d4a91
--- /dev/null
+++ b/ghc/compiler/tests/printing/Print001.hs
@@ -0,0 +1,18 @@
+--!!! Print001.hs: printing of types (esp for interfaces)
+
+module Print001 where
+
+data Foo d e f = MkFoo [((d->Int)->d)->e] (d->e, e->e) ()
+data Bar a = BarNil
+ | BarCon (Foo a a a) (Bar a)
+
+mkFoo = MkFoo
+
+f :: Eq a => (a -> b -> c) -> (a -> b -> c)
+f x = x
+
+f2 :: (Eq a, Ord a, Ix c) => (a -> b -> c) -> (a -> b -> c)
+f2 x = x
+
+g :: Foo Int (a -> b) (a -> [(a, Double, Int)]) -> Float
+g x = 2.0