aboutsummaryrefslogtreecommitdiffstats
path: root/tests
diff options
context:
space:
mode:
authorMax Rabkin <max.rabkin@gmail.com>2009-10-14 22:22:13 +0200
committerMax Rabkin <max.rabkin@gmail.com>2009-10-14 22:22:13 +0200
commit0baf697296799f0146093287d9455c4a2dcef8f2 (patch)
tree50533d3ab650986f34a680241135bfbcb3ad1cc2 /tests
parent6afa8de084f735296c8b9020d84aa05c4b184257 (diff)
downloadXMonadContrib-0baf697296799f0146093287d9455c4a2dcef8f2.tar.gz
XMonadContrib-0baf697296799f0146093287d9455c4a2dcef8f2.tar.xz
XMonadContrib-0baf697296799f0146093287d9455c4a2dcef8f2.zip
Move limitSelect into L.LimitWindows
Ignore-this: 51d6e9da4a6a4f683cd145371e90be17 darcs-hash:20091014202213-a5338-1896e12a9c253692e03c0ac1d624fe0e26312e21.gz
Diffstat (limited to 'tests')
-rw-r--r--tests/test_Selective.hs8
1 files changed, 6 insertions, 2 deletions
diff --git a/tests/test_Selective.hs b/tests/test_Selective.hs
index 4de4632..15ea5c0 100644
--- a/tests/test_Selective.hs
+++ b/tests/test_Selective.hs
@@ -1,6 +1,10 @@
{-# LANGUAGE ScopedTypeVariables, FlexibleInstances #-}
-import XMonad.Layout.Selective
+-- Tests for limitSelect-related code in L.LimitWindows.
+-- To run these tests, export (select,update,Selection(..),updateAndSelect) from
+-- L.LimitWindows.
+
+import XMonad.Layout.LimitWindows
import XMonad.StackSet hiding (focusUp, focusDown)
import Control.Applicative ((<$>))
import Test.QuickCheck
@@ -13,7 +17,7 @@ instance Arbitrary (Stack Int) where
return $ Stack { up=[xs-1,xs-2..0], focus=xs, down=[xs+1..xs+ys] }
coarbitrary = undefined
-instance Arbitrary Selection where
+instance Arbitrary (Selection a) where
arbitrary = do
nm <- arbNat
st <- arbNat