2022-12-29 13:36:26 -05:00
|
|
|
{-# LANGUAGE OverloadedStrings #-}
|
2020-04-01 22:06:00 -04:00
|
|
|
|
2022-12-30 14:58:23 -05:00
|
|
|
-- Functions for formatting and spawning shell commands
|
|
|
|
|
2020-04-01 20:17:47 -04:00
|
|
|
module XMonad.Internal.Shell
|
2021-11-07 13:35:08 -05:00
|
|
|
( fmtCmd
|
2020-04-01 20:17:47 -04:00
|
|
|
, spawnCmd
|
2022-12-29 00:06:55 -05:00
|
|
|
, spawn
|
2022-12-29 14:49:06 -05:00
|
|
|
, spawnPipe
|
2021-06-17 01:17:59 -04:00
|
|
|
, doubleQuote
|
|
|
|
, singleQuote
|
2021-06-19 00:17:47 -04:00
|
|
|
, skip
|
2022-12-29 12:01:40 -05:00
|
|
|
, runProcess
|
|
|
|
, proc
|
|
|
|
, shell
|
2020-04-01 20:17:47 -04:00
|
|
|
, (#!&&)
|
|
|
|
, (#!||)
|
2021-06-20 01:01:36 -04:00
|
|
|
, (#!|)
|
2020-04-01 20:17:47 -04:00
|
|
|
, (#!>>)
|
2022-12-30 14:58:23 -05:00
|
|
|
)
|
|
|
|
where
|
2022-12-26 14:45:49 -05:00
|
|
|
|
2022-12-30 14:58:23 -05:00
|
|
|
import RIO
|
|
|
|
import qualified RIO.Text as T
|
2022-12-29 14:49:06 -05:00
|
|
|
import qualified System.Process.Typed as P
|
2022-12-30 14:58:23 -05:00
|
|
|
import qualified XMonad.Core as X
|
|
|
|
import qualified XMonad.Util.Run as XR
|
2020-03-28 18:38:38 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Fork a new process and wait for its exit code.
|
|
|
|
--
|
|
|
|
-- This function will work despite xmonad ignoring SIGCHLD.
|
|
|
|
--
|
|
|
|
-- A few facts about xmonad (and window managers in general):
|
|
|
|
-- 1) It is single-threaded (since X is single threaded)
|
|
|
|
-- 2) Because of (1), it ignores SIGCHLD, which means any subprocess started
|
|
|
|
-- by xmonad will instantly be reaped after spawning. This guarantees the
|
|
|
|
-- main thread running the WM will never be blocked.
|
|
|
|
--
|
|
|
|
-- In general, this means I can't wait for exit codes (since wait() doesn't
|
|
|
|
-- work) See https://github.com/xmonad/xmonad/issues/113.
|
|
|
|
--
|
|
|
|
-- If I want an exit code, The best solution (I can come up with), is to use
|
|
|
|
-- bracket to uninstall handlers, run process (with wait), and then reinstall
|
|
|
|
-- handlers. I can use this with a much higher-level interface which will make
|
|
|
|
-- things easier. This obviously means that if the process is running in the
|
|
|
|
-- main thread, it needs to be almost instantaneous. Note if using a high-level
|
|
|
|
-- API for this, the process needs to spawn, finish, and be reaped by the
|
|
|
|
-- xmonad process all while the signal handlers are 'disabled' (which limits
|
|
|
|
-- the functions I can use to those that call waitForProcess).
|
|
|
|
--
|
|
|
|
-- XMonad and contrib use their own method of spawning subprocesses using the
|
|
|
|
-- extremely low-level 'System.Process.Posix' API. See the code for
|
|
|
|
-- 'XMonad.Core.spawn' or 'XMonad.Util.Run.safeSpawn'. Specifically, the
|
|
|
|
-- sequence is (in terms of the low level Linux API):
|
|
|
|
-- 1) call fork()
|
|
|
|
-- 2) uninstall signal handlers (to allow wait() to work in subprocesses)
|
|
|
|
-- 3) call setsid() (so killing the child will kill its children, if any)
|
|
|
|
-- 4) start new thing with exec()
|
|
|
|
--
|
|
|
|
-- In contrast with high-level APIs like 'System.Process', this will leave no
|
|
|
|
-- trailing data structures to clean up, at the cost of being gross to look at
|
|
|
|
-- and possibly more error-prone.
|
2022-12-31 16:20:41 -05:00
|
|
|
runProcess :: MonadUnliftIO m => P.ProcessConfig a b c -> m ExitCode
|
2022-12-29 15:22:48 -05:00
|
|
|
runProcess = withDefaultSignalHandlers . P.runProcess
|
2020-03-18 12:17:39 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Run an action without xmonad's signal handlers.
|
2022-12-31 16:20:41 -05:00
|
|
|
withDefaultSignalHandlers :: MonadUnliftIO m => m a -> m a
|
2022-12-29 00:06:55 -05:00
|
|
|
withDefaultSignalHandlers =
|
|
|
|
bracket_ X.uninstallSignalHandlers X.installSignalHandlers
|
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Set a child process to create a new group and session
|
2022-12-29 12:01:40 -05:00
|
|
|
addGroupSession :: P.ProcessConfig x y z -> P.ProcessConfig x y z
|
|
|
|
addGroupSession = P.setCreateGroup True . P.setNewSession True
|
2022-12-29 00:06:55 -05:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Create a 'ProcessConfig' for a shell command
|
2022-12-29 12:01:40 -05:00
|
|
|
shell :: T.Text -> P.ProcessConfig () () ()
|
|
|
|
shell = addGroupSession . P.shell . T.unpack
|
2022-12-29 00:06:55 -05:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Create a 'ProcessConfig' for a command with arguments
|
2022-12-29 12:01:40 -05:00
|
|
|
proc :: FilePath -> [T.Text] -> P.ProcessConfig () () ()
|
|
|
|
proc cmd args = addGroupSession $ P.proc cmd (T.unpack <$> args)
|
2022-12-29 00:06:55 -05:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Run 'XMonad.Core.spawn' with 'Text' input.
|
2022-12-29 12:01:40 -05:00
|
|
|
spawn :: MonadIO m => T.Text -> m ()
|
2022-12-29 14:49:06 -05:00
|
|
|
spawn = X.spawn . T.unpack
|
2022-12-29 00:06:55 -05:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Run 'XMonad.Run.Utils.spawnPipe' with 'Text' input.
|
2022-12-29 14:49:06 -05:00
|
|
|
spawnPipe :: MonadIO m => T.Text -> m Handle
|
|
|
|
spawnPipe = XR.spawnPipe . T.unpack
|
2022-12-29 00:06:55 -05:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Run 'XMonad.Core.spawn' with a command and arguments
|
2022-12-26 14:45:49 -05:00
|
|
|
spawnCmd :: MonadIO m => FilePath -> [T.Text] -> m ()
|
2022-12-29 12:01:40 -05:00
|
|
|
spawnCmd cmd = spawn . fmtCmd cmd
|
2020-03-18 12:17:39 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Format a command and list of arguments as 'Text'
|
2022-12-26 14:45:49 -05:00
|
|
|
fmtCmd :: FilePath -> [T.Text] -> T.Text
|
|
|
|
fmtCmd cmd args = T.unwords $ T.pack cmd : args
|
|
|
|
|
|
|
|
op :: T.Text -> T.Text -> T.Text -> T.Text
|
|
|
|
op a x b = T.unwords [a, x, b]
|
2020-04-01 22:06:00 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Format two shell expressions separated by "&&"
|
2022-12-26 14:45:49 -05:00
|
|
|
(#!&&) :: T.Text -> T.Text -> T.Text
|
|
|
|
cmdA #!&& cmdB = op cmdA "&&" cmdB
|
2020-03-18 12:17:39 -04:00
|
|
|
|
|
|
|
infixr 0 #!&&
|
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Format two shell expressions separated by "|"
|
2022-12-26 14:45:49 -05:00
|
|
|
(#!|) :: T.Text -> T.Text -> T.Text
|
|
|
|
cmdA #!| cmdB = op cmdA "|" cmdB
|
2021-06-20 01:01:36 -04:00
|
|
|
|
|
|
|
infixr 0 #!|
|
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Format two shell expressions separated by "||"
|
2022-12-26 14:45:49 -05:00
|
|
|
(#!||) :: T.Text -> T.Text -> T.Text
|
|
|
|
cmdA #!|| cmdB = op cmdA "||" cmdB
|
2020-03-18 12:17:39 -04:00
|
|
|
|
|
|
|
infixr 0 #!||
|
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Format two shell expressions separated by ";"
|
2022-12-26 14:45:49 -05:00
|
|
|
(#!>>) :: T.Text -> T.Text -> T.Text
|
|
|
|
cmdA #!>> cmdB = op cmdA ";" cmdB
|
2020-03-18 12:17:39 -04:00
|
|
|
|
|
|
|
infixr 0 #!>>
|
2021-06-17 01:17:59 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Wrap input in double quotes
|
2022-12-26 14:45:49 -05:00
|
|
|
doubleQuote :: T.Text -> T.Text
|
|
|
|
doubleQuote s = T.concat ["\"", s, "\""]
|
2021-06-17 01:17:59 -04:00
|
|
|
|
2022-12-29 15:22:48 -05:00
|
|
|
-- | Wrap input in single quotes
|
2022-12-26 14:45:49 -05:00
|
|
|
singleQuote :: T.Text -> T.Text
|
|
|
|
singleQuote s = T.concat ["'", s, "'"]
|
2021-11-07 13:35:08 -05:00
|
|
|
|
|
|
|
skip :: Monad m => m ()
|
|
|
|
skip = return ()
|