summaryrefslogtreecommitdiffstats
path: root/XMonad
diff options
context:
space:
mode:
authorDon Stewart <dons@galois.com>2007-11-19 03:24:29 +0100
committerDon Stewart <dons@galois.com>2007-11-19 03:24:29 +0100
commitb11f717a589d6a6349e882a46ceb9994a12af631 (patch)
tree1ed90603ce610f4a7cb0e6da0ac9e58fd475b73d /XMonad
parente23b5ce3cb62232f2c8ff8a8e57dc84db241bc7f (diff)
downloadmetatile-b11f717a589d6a6349e882a46ceb9994a12af631.tar
metatile-b11f717a589d6a6349e882a46ceb9994a12af631.zip
Use xmessage to present a failure message to users when the config file cannot be loaded
darcs-hash:20071119022429-cba2c-c0bca5c0592d5def91587d73eb8d391aa7fdd0d1
Diffstat (limited to 'XMonad')
-rw-r--r--XMonad/Core.hs24
1 files changed, 20 insertions, 4 deletions
diff --git a/XMonad/Core.hs b/XMonad/Core.hs
index 5ea2d03..84b1311 100644
--- a/XMonad/Core.hs
+++ b/XMonad/Core.hs
@@ -33,7 +33,7 @@ module XMonad.Core (
import XMonad.StackSet
import Prelude hiding ( catch )
-import Control.Exception (catch, throw, Exception(ExitException))
+import Control.Exception (catch, bracket, throw, Exception(ExitException))
import Control.Monad.State
import Control.Monad.Reader
import System.IO
@@ -299,19 +299,35 @@ restart mprog resume = do
--
-- The file is only recompiled if it is newer than its binary.
--
+-- In the event of an error, signalled with GHC returning non-zero exit
+-- status, any stderr produced by GHC, written to the file xmonad.errors,
+-- will be displayed to the user with xmessage
+--
recompile :: IO ()
recompile = do
dir <- liftM (++ "/.xmonad") getHomeDirectory
let bin = dir ++ "/" ++ "xmonad"
+ err = bin ++ ".errors"
src = bin ++ ".hs"
yes <- doesFileExist src
when yes $ do
srcT <- getModificationTime src
binT <- getModificationTime bin
when (srcT > binT) $ do
- waitForProcess =<< runProcess "ghc" ["--make", "xmonad.hs", "-i"] (Just dir)
- Nothing Nothing Nothing Nothing
- return ()
+ status <- bracket (openFile err WriteMode) hClose $ \h -> do
+ waitForProcess =<< runProcess "ghc" ["--make", "xmonad.hs", "-i", "-v0"] (Just dir)
+ Nothing Nothing Nothing (Just h)
+
+ -- now, if it fails, run xmessage to let the user know:
+ when (status /= ExitSuccess) $ do
+ ghcErr <- readFile err
+ let msg = unlines $
+ ["Error detected while loading xmonad configuration file: " ++ src]
+ ++ lines ghcErr ++ ["","Please check the file for errors."]
+
+ waitForProcess =<< runProcess "xmessage" [msg]
+ Nothing Nothing Nothing Nothing Nothing
+ return ()
-- | Run a side effecting action with the current workspace. Like 'when' but
whenJust :: Monad m => Maybe a -> (a -> m ()) -> m ()