aboutsummaryrefslogtreecommitdiffstats
diff options
context:
space:
mode:
-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)