mirror of
https://github.com/xmonad/xmonad.git
synced 2025-05-19 00:20:22 -07:00
Remove manageHook from Main.hs-boot
This commit is contained in:
parent
23035e944b
commit
b0b43050f4
5
Main.hs
5
Main.hs
@ -20,8 +20,8 @@ module Main where
|
|||||||
-- Useful imports
|
-- Useful imports
|
||||||
--
|
--
|
||||||
import Control.Monad.Reader ( asks )
|
import Control.Monad.Reader ( asks )
|
||||||
import XMonad hiding (workspaces)
|
import XMonad hiding (workspaces, manageHook)
|
||||||
import qualified XMonad (workspaces)
|
import qualified XMonad (workspaces, manageHook)
|
||||||
import Layouts
|
import Layouts
|
||||||
import Operations
|
import Operations
|
||||||
import qualified StackSet as W
|
import qualified StackSet as W
|
||||||
@ -253,6 +253,7 @@ defaultConfig = XConfig { borderWidth = 1 -- Width of the window border in pixel
|
|||||||
--
|
--
|
||||||
-- See the 'DynamicLog' extension for examples.
|
-- See the 'DynamicLog' extension for examples.
|
||||||
, logHook = return ()
|
, logHook = return ()
|
||||||
|
, XMonad.manageHook = manageHook
|
||||||
}
|
}
|
||||||
|
|
||||||
-- % The main function
|
-- % The main function
|
||||||
|
@ -2,4 +2,3 @@ module Main where
|
|||||||
import Graphics.X11.Xlib (KeyMask,Window)
|
import Graphics.X11.Xlib (KeyMask,Window)
|
||||||
import XMonad
|
import XMonad
|
||||||
numlockMask :: KeyMask
|
numlockMask :: KeyMask
|
||||||
manageHook :: Window -> String -> String -> String -> X (WindowSet -> WindowSet)
|
|
||||||
|
@ -37,7 +37,7 @@ import Graphics.X11.Xlib
|
|||||||
import Graphics.X11.Xinerama (getScreenInfo)
|
import Graphics.X11.Xinerama (getScreenInfo)
|
||||||
import Graphics.X11.Xlib.Extras
|
import Graphics.X11.Xlib.Extras
|
||||||
|
|
||||||
import {-# SOURCE #-} Main (manageHook,numlockMask)
|
import {-# SOURCE #-} Main (numlockMask)
|
||||||
|
|
||||||
-- ---------------------------------------------------------------------
|
-- ---------------------------------------------------------------------
|
||||||
-- |
|
-- |
|
||||||
@ -67,7 +67,8 @@ manage w = whenX (fmap not $ isClient w) $ withDisplay $ \d -> do
|
|||||||
|
|
||||||
n <- fmap (fromMaybe "") $ io $ fetchName d w
|
n <- fmap (fromMaybe "") $ io $ fetchName d w
|
||||||
(ClassHint rn rc) <- io $ getClassHint d w
|
(ClassHint rn rc) <- io $ getClassHint d w
|
||||||
g <- manageHook w n rn rc `catchX` return id
|
mh <- asks (manageHook . config)
|
||||||
|
g <- mh w n rn rc `catchX` return id
|
||||||
windows (g . f)
|
windows (g . f)
|
||||||
|
|
||||||
-- | unmanage. A window no longer exists, remove it from the window
|
-- | unmanage. A window no longer exists, remove it from the window
|
||||||
|
@ -60,6 +60,7 @@ data XConfig = forall l. (LayoutClass l Window, Read (l Window)) =>
|
|||||||
, focusedBorderColor :: !String
|
, focusedBorderColor :: !String
|
||||||
, terminal :: !String
|
, terminal :: !String
|
||||||
, layoutHook :: !(l Window)
|
, layoutHook :: !(l Window)
|
||||||
|
, manageHook :: Window -> String -> String -> String -> X (WindowSet -> WindowSet)
|
||||||
, workspaces :: ![String]
|
, workspaces :: ![String]
|
||||||
, defaultGaps :: ![(Int,Int,Int,Int)]
|
, defaultGaps :: ![(Int,Int,Int,Int)]
|
||||||
, keys :: !(M.Map (ButtonMask,KeySym) (X ()))
|
, keys :: !(M.Map (ButtonMask,KeySym) (X ()))
|
||||||
|
Loading…
x
Reference in New Issue
Block a user