Use xmessage from core

Related: https://github.com/xmonad/xmonad/pull/318
This commit is contained in:
Tomas Janousek
2021-08-07 22:04:09 +01:00
parent 8d557c6954
commit 07040cbd58
7 changed files with 7 additions and 21 deletions

View File

@@ -76,7 +76,6 @@ import qualified XMonad.Hooks.DynamicLog as DL
import qualified XMonad.StackSet as W
import Data.Map (Map)
import System.IO (hClose, hPutStr)
import XMonad.Prompt (XPConfig)
import XMonad.Prompt.Workspace (workspacePrompt)
@@ -91,8 +90,6 @@ import XMonad.Hooks.WorkspaceHistory
, workspaceHistoryModify
)
import XMonad.Util.Run (spawnPipe)
-- $overview
-- This module allows to organize your workspaces on a precise topic basis. So
-- instead of having a workspace called `work' you can setup one workspace per
@@ -383,13 +380,6 @@ checkTopicConfig tags tg = do
check diffTopic "Seen but missing topics/workspaces"
check dups "Duplicate topics/workspaces"
-- | Display the given message using the @xmessage@ program.
xmessage :: String -> IO ()
xmessage s = do
h <- spawnPipe "xmessage -file -"
hPutStr h s
hClose h
-- | Convenience type for specifying topics.
data TopicItem = TI
{ tiName :: !Topic -- ^ 'Topic' ≡ 'String'

View File

@@ -68,7 +68,6 @@ import Control.Monad.State
import Data.Tree
import Foreign (shiftL, shiftR, (.&.))
import System.IO
import System.Posix.Process (forkProcess, executeFile)
import XMonad hiding (liftX)
import XMonad.Prelude
import XMonad.StackSet as W
@@ -409,7 +408,7 @@ treeselectWorkspace c xs f = do
, "XConfig.workspaces: "
] ++ map tag ws
hPutStrLn stderr msg
_ <- forkProcess $ executeFile "xmessage" True [msg] Nothing
xmessage msg
return ()
where
mkNode n w = do