aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Layout/Groups.hs
diff options
context:
space:
mode:
authorAdam Vogt <vogt.adam@gmail.com>2010-10-02 04:08:41 +0200
committerAdam Vogt <vogt.adam@gmail.com>2010-10-02 04:08:41 +0200
commit3794ab83abadaf9de9c2a386bbbb7d4c4d0513d0 (patch)
tree7cda97f0858e2d0f3a0e61cbf17fa288d6505042 /XMonad/Layout/Groups.hs
parentafd0255738c17eef006c0ba7ddda771cff3c52c6 (diff)
downloadXMonadContrib-3794ab83abadaf9de9c2a386bbbb7d4c4d0513d0.tar.gz
XMonadContrib-3794ab83abadaf9de9c2a386bbbb7d4c4d0513d0.tar.xz
XMonadContrib-3794ab83abadaf9de9c2a386bbbb7d4c4d0513d0.zip
Clarify the note on -XRank2Types in L.Groups
Ignore-this: 4ffe5d2d0be1e8b8a8c151b134e963f2 darcs-hash:20101002020841-1499c-c8512eb095bd56be173c35004b24016d457c74e9.gz
Diffstat (limited to 'XMonad/Layout/Groups.hs')
-rw-r--r--XMonad/Layout/Groups.hs7
1 files changed, 4 insertions, 3 deletions
diff --git a/XMonad/Layout/Groups.hs b/XMonad/Layout/Groups.hs
index 4eaea40..984aa46 100644
--- a/XMonad/Layout/Groups.hs
+++ b/XMonad/Layout/Groups.hs
@@ -353,9 +353,10 @@ refocus g = case getFocusZ $ gZipper $ W.focus $ groups g
-- * Duplicate layouts (only one will be kept, the rest will
-- get the base layout)
--
--- Note that 'ModifySpec' is a rank-2 type (indicating that 'ModifySpec's must be polymorphic
--- in the layout type), so you'll need to add @{-# LANGUAGE Rank2Types #-}@ at the beginning
--- of any module that defines functions taking 'ModifySpec's as arguments, or returning them.
+-- Note that 'ModifySpec' is a rank-2 type (indicating that 'ModifySpec's must
+-- be polymorphic in the layout type), so if you define functions taking
+-- 'ModifySpec's as arguments, or returning them, you'll need to write a type
+-- signature and add @{-# LANGUAGE Rank2Types #-}@ at the beginning
type ModifySpec = forall l. WithID l Window
-> Zipper (Group l Window)
-> Zipper (Group l Window)