Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/6f7285c254c2eb47f1df82540294a9fe207862e0

>---------------------------------------------------------------

commit 6f7285c254c2eb47f1df82540294a9fe207862e0
Author: Simon Peyton Jones <simo...@microsoft.com>
Date:   Tue Oct 25 16:23:26 2011 +0100

    Test :kind and :kind! commands

>---------------------------------------------------------------

 tests/ghci/scripts/GhciKinds.hs     |    6 ++++++
 tests/ghci/scripts/GhciKinds.script |    5 +++++
 tests/ghci/scripts/GhciKinds.stdout |    5 +++++
 tests/ghci/scripts/all.T            |    1 +
 4 files changed, 17 insertions(+), 0 deletions(-)

diff --git a/tests/ghci/scripts/GhciKinds.hs b/tests/ghci/scripts/GhciKinds.hs
new file mode 100644
index 0000000..4945814
--- /dev/null
+++ b/tests/ghci/scripts/GhciKinds.hs
@@ -0,0 +1,6 @@
+{-# LANGUAGE TypeFamilies #-}
+module GhciKinds where
+
+type family F a :: *
+type instance F [a] = a -> F a
+type instance F Int = Bool
diff --git a/tests/ghci/scripts/GhciKinds.script 
b/tests/ghci/scripts/GhciKinds.script
new file mode 100644
index 0000000..310c2a8
--- /dev/null
+++ b/tests/ghci/scripts/GhciKinds.script
@@ -0,0 +1,5 @@
+:kind Int
+:kind Maybe
+:l GhciKinds
+:kind F [[[Int]]]
+:kind! F [[[Int]]]
diff --git a/tests/ghci/scripts/GhciKinds.stdout 
b/tests/ghci/scripts/GhciKinds.stdout
new file mode 100644
index 0000000..3961994
--- /dev/null
+++ b/tests/ghci/scripts/GhciKinds.stdout
@@ -0,0 +1,5 @@
+Int :: *
+Maybe :: * -> *
+F [[[Int]]] :: *
+F [[[Int]]] :: *
+= [[Int]] -> [Int] -> Int -> Bool
diff --git a/tests/ghci/scripts/all.T b/tests/ghci/scripts/all.T
index 2015b8f..add74a8 100644
--- a/tests/ghci/scripts/all.T
+++ b/tests/ghci/scripts/all.T
@@ -106,3 +106,4 @@ test('T5417', normal, ghci_script, ['T5417.script'])
 test('T5545', normal, ghci_script, ['T5545.script'])
 test('T5557', normal, ghci_script, ['T5557.script'])
 test('T5566', normal, ghci_script, ['T5566.script'])
+test('GhciKinds', normal, ghci_script, ['GhciKinds.script'])



_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to