{-# OPTIONS_GHC -fno-warn-missing-signatures #-}

-----------------------------------------------------------------------------
-- |
-- Module       : XMonad.Config.Bepo
-- Description  : Fix keybindings for the BEPO keyboard layout.
-- Copyright    : (c) Yorick Laupa <yo.eight@gmail.com>
-- License      : BSD
--
-- Maintainer   : Yorick Laupa <yo.eight@gmail.com>
-- Stability    : stable
-- Portability  : unportable
--
-- This module fixes some of the keybindings for the francophone among you who
-- use a BEPO keyboard layout. Based on XMonad.Config.Azerty

module XMonad.Config.Bepo (
    -- * Usage
    -- $usage
    bepoConfig, bepoKeys
    ) where

import XMonad
import qualified XMonad.StackSet as W

import qualified Data.Map as M

-- $usage
-- To use this module, start with the following @xmonad.hs@:
--
-- > import XMonad
-- > import XMonad.Config.Bepo
-- >
-- > main = xmonad bepoConfig
--
-- If you prefer, an bepoKeys function is provided which you can use as so:
--
-- > import qualified Data.Map as M
-- > main = xmonad someConfig { keys = \c -> bepoKeys c `M.union` keys someConfig c }

bepoConfig :: XConfig (Choose Tall (Choose (Mirror Tall) Full))
bepoConfig = forall a. Default a => a
def { keys :: XConfig Layout -> Map (ButtonMask, KeySym) (X ())
keys = forall {l :: * -> *}. XConfig l -> Map (ButtonMask, KeySym) (X ())
bepoKeys forall a. Semigroup a => a -> a -> a
<> forall (l :: * -> *).
XConfig l -> XConfig Layout -> Map (ButtonMask, KeySym) (X ())
keys forall a. Default a => a
def }

bepoKeys :: XConfig l -> Map (ButtonMask, KeySym) (X ())
bepoKeys conf :: XConfig l
conf@XConfig { modMask :: forall (l :: * -> *). XConfig l -> ButtonMask
modMask = ButtonMask
modm } = forall k a. Ord k => [(k, a)] -> Map k a
M.fromList forall a b. (a -> b) -> a -> b
$
    ((ButtonMask
modm, KeySym
xK_semicolon), forall a. Message a => a -> X ()
sendMessage (Int -> IncMasterN
IncMasterN (-Int
1)))
    forall a. a -> [a] -> [a]
: [((ButtonMask
m forall a. Bits a => a -> a -> a
.|. ButtonMask
modm, KeySym
k), (WindowSet -> WindowSet) -> X ()
windows forall a b. (a -> b) -> a -> b
$ WorkspaceId -> WindowSet -> WindowSet
f WorkspaceId
i)
          | (WorkspaceId
i, KeySym
k) <- forall a b. [a] -> [b] -> [(a, b)]
zip (forall (l :: * -> *). XConfig l -> [WorkspaceId]
workspaces XConfig l
conf) [KeySym
0x22,KeySym
0xab,KeySym
0xbb,KeySym
0x28,KeySym
0x29,KeySym
0x40,KeySym
0x2b,KeySym
0x2d,KeySym
0x2f,KeySym
0x2a],
            (WorkspaceId -> WindowSet -> WindowSet
f, ButtonMask
m) <- [(forall s i l a sd.
(Eq s, Eq i) =>
i -> StackSet i l a s sd -> StackSet i l a s sd
W.greedyView, ButtonMask
0), (forall a s i l sd.
(Ord a, Eq s, Eq i) =>
i -> StackSet i l a s sd -> StackSet i l a s sd
W.shift, ButtonMask
shiftMask)]]