From 4866f2e367dfcf22a9591231ba40948826a1b438 Mon Sep 17 00:00:00 2001 From: Spencer Janssen Date: Thu, 1 Nov 2007 21:10:59 +0100 Subject: Hierarchify darcs-hash:20071101201059-a5988-fc1f1262bec1b69e13ba18ae7cefeafc8c4471d4.gz --- MagicFocus.hs | 51 --------------------------------------------------- 1 file changed, 51 deletions(-) delete mode 100644 MagicFocus.hs (limited to 'MagicFocus.hs') diff --git a/MagicFocus.hs b/MagicFocus.hs deleted file mode 100644 index 91f38ee..0000000 --- a/MagicFocus.hs +++ /dev/null @@ -1,51 +0,0 @@ -{-# LANGUAGE FlexibleContexts, FlexibleInstances, MultiParamTypeClasses, TypeSynonymInstances #-} - ------------------------------------------------------------------------------ --- | --- Module : XMonadContrib.MagicFocus --- Copyright : (c) Peter De Wachter --- License : BSD --- --- Maintainer : Peter De Wachter --- Stability : unstable --- Portability : unportable --- --- Automagically put the focused window in the master area. ------------------------------------------------------------------------------ - -module XMonadContrib.MagicFocus - (-- * Usage - -- $usage - MagicFocus(MagicFocus) - ) where - -import Graphics.X11.Xlib -import XMonad -import XMonad.StackSet - --- $usage --- > import XMonadContrib.MagicFocus --- > layouts = [ Layout $ MagicFocus tiled , Layout $ MagicFocus $ Mirror tiled ] - --- %import XMonadContrib.MagicFocus --- %layout , Layout $ MagicFocus tiled --- %layout , Layout $ MagicFocus $ Mirror tiled - - -data MagicFocus l a = MagicFocus (l a) deriving ( Show , Read ) - -instance (LayoutClass l Window) => LayoutClass (MagicFocus l) Window where - doLayout = magicFocus - -magicFocus :: LayoutClass l Window => MagicFocus l Window -> Rectangle - -> Stack Window -> X ([(Window, Rectangle)], Maybe (MagicFocus l Window)) -magicFocus (MagicFocus l) r s = - withWindowSet $ \wset -> do - (ws,nl) <- doLayout l r (swap s $ peek wset) - case nl of - Nothing -> return (ws, Nothing) - Just l' -> return (ws, Just $ MagicFocus l') - -swap :: (Eq a) => Stack a -> Maybe a -> Stack a -swap (Stack f u d) focused | Just f == focused = Stack f [] (reverse u ++ d) - | otherwise = Stack f u d -- cgit v1.2.3