xmonad-config/lib/XMonad/Internal/DBus/Removable.hs

89 lines
2.7 KiB
Haskell
Raw Normal View History

--------------------------------------------------------------------------------
-- | Module for monitoring removable drive events
--
-- Currently, its only purpose is to play Super Mario sounds when a drive is
-- inserted or removed. Why? Because I can.
module XMonad.Internal.DBus.Removable (runRemovableMon) where
import Control.Monad
2021-11-20 01:15:04 -05:00
import Data.Map.Lazy (Map, member)
import DBus
import DBus.Client
2022-03-05 18:18:16 -05:00
import XMonad.Core (io)
2021-11-20 01:15:04 -05:00
import XMonad.Internal.Command.Desktop
import XMonad.Internal.Dependency
bus :: BusName
bus = busName_ "org.freedesktop.UDisks2"
path :: ObjectPath
path = objectPath_ "/org/freedesktop/UDisks2"
interface :: InterfaceName
interface = interfaceName_ "org.freedesktop.DBus.ObjectManager"
memAdded :: MemberName
memAdded = memberName_ "InterfacesAdded"
memRemoved :: MemberName
memRemoved = memberName_ "InterfacesRemoved"
dbusDep :: MemberName -> DBusDependency_
dbusDep m = Endpoint bus path interface $ Signal_ m
2021-11-20 11:48:05 -05:00
addedDep :: DBusDependency_
2021-11-07 20:16:53 -05:00
addedDep = dbusDep memAdded
removedDep :: DBusDependency_
2021-11-07 20:16:53 -05:00
removedDep = dbusDep memRemoved
driveInsertedSound :: FilePath
driveInsertedSound = "smb_powerup.wav"
driveRemovedSound :: FilePath
driveRemovedSound = "smb_pipe.wav"
ruleUdisks :: MatchRule
ruleUdisks = matchAny
{ matchPath = Just path
, matchInterface = Just interface
}
driveFlag :: String
driveFlag = "org.freedesktop.UDisks2.Drive"
addedHasDrive :: [Variant] -> Bool
addedHasDrive [_, a] = maybe False (member driveFlag)
(fromVariant a :: Maybe (Map String (Map String Variant)))
addedHasDrive _ = False
removedHasDrive :: [Variant] -> Bool
removedHasDrive [_, a] = maybe False (driveFlag `elem`)
(fromVariant a :: Maybe [String])
removedHasDrive _ = False
playSoundMaybe :: FilePath -> Bool -> IO ()
2022-03-05 18:18:16 -05:00
playSoundMaybe p b = when b $ io $ playSound p
2020-07-10 18:48:20 -04:00
-- NOTE: the udisks2 service should be already running for this module to work.
-- If it not already, we won't see any signals from the dbus until it is
-- started (it will work after it is started however). It seems safe to simply
-- enable the udisks2 service at boot; however this is not default behavior.
2021-11-25 00:12:00 -05:00
listenDevices :: Client -> IO ()
listenDevices client = do
addMatch' memAdded driveInsertedSound addedHasDrive
addMatch' memRemoved driveRemovedSound removedHasDrive
where
addMatch' m p f = void $ addMatch client ruleUdisks { matchMember = Just m }
$ playSoundMaybe p . f . signalBody
runRemovableMon :: Maybe Client -> SometimesIO
runRemovableMon cl =
2022-06-28 23:27:55 -04:00
sometimesDBus cl "removeable device monitor" "dbus monitor" deps listenDevices
where
deps = toAnd addedDep removedDep