aboutsummaryrefslogtreecommitdiffstats
path: root/XMonad/Layout/MultiToggle
diff options
context:
space:
mode:
Diffstat (limited to '')
-rw-r--r--XMonad/Layout/MultiToggle.hs7
-rw-r--r--XMonad/Layout/MultiToggle/Instances.hs4
2 files changed, 3 insertions, 8 deletions
diff --git a/XMonad/Layout/MultiToggle.hs b/XMonad/Layout/MultiToggle.hs
index eb753d4..a5dbb48 100644
--- a/XMonad/Layout/MultiToggle.hs
+++ b/XMonad/Layout/MultiToggle.hs
@@ -1,4 +1,4 @@
-{-# OPTIONS_GHC -fglasgow-exts #-}
+{-# LANGUAGE DeriveDataTypeable, ExistentialQuantification, Rank2Types, MultiParamTypeClasses, FunctionalDependencies, FlexibleInstances, FlexibleContexts, PatternGuards #-}
-----------------------------------------------------------------------------
-- |
@@ -92,10 +92,7 @@ import Data.Maybe
-- > transform _ x k = k (Mirror x)
--
-- Note, you need to put @{-\# LANGUAGE DeriveDataTypeable \#-}@ at the
--- beginning of your file (ghc 6.8 only; with ghc 6.6 you can use
--- @{-\# OPTIONS_GHC -fglasgow-exts \#-}@ instead) to be able to
--- derive "Data.Typeable".
---
+-- beginning of your file.
-- | A class to identify custom transformers (and look up transforming
-- functions by type).
diff --git a/XMonad/Layout/MultiToggle/Instances.hs b/XMonad/Layout/MultiToggle/Instances.hs
index 378c12c..a409aa8 100644
--- a/XMonad/Layout/MultiToggle/Instances.hs
+++ b/XMonad/Layout/MultiToggle/Instances.hs
@@ -1,6 +1,4 @@
-{-# OPTIONS_GHC -fglasgow-exts #-}
--- above is for compatibility with GHC 6.6.
-{- LANGUAGE TypeSynonymInstances, DeriveDataTypeable -}
+{-# LANGUAGE TypeSynonymInstances, DeriveDataTypeable, MultiParamTypeClasses #-}
-----------------------------------------------------------------------------
-- |