summaryrefslogtreecommitdiff
path: root/src/GDB.hs
diff options
context:
space:
mode:
authorRoman Smrž <roman.smrz@seznam.cz>2022-10-13 22:13:29 +0200
committerRoman Smrž <roman.smrz@seznam.cz>2022-10-18 23:47:39 +0200
commit958c0a17842612f667cba89fe6712a2197985aad (patch)
tree71a579d47469e9c9f96c13f0fd9b4daff41b4a28 /src/GDB.hs
parent000209c13299f1c046dc60e3649c17e9520680de (diff)
GDB process type and separate start function
Diffstat (limited to 'src/GDB.hs')
-rw-r--r--src/GDB.hs66
1 files changed, 52 insertions, 14 deletions
diff --git a/src/GDB.hs b/src/GDB.hs
index 8e04c42..abe0cf9 100644
--- a/src/GDB.hs
+++ b/src/GDB.hs
@@ -1,10 +1,16 @@
+{-# LANGUAGE OverloadedStrings #-}
+
module GDB (
- gdbCmd, gdbInit,
+ GDB, gdbProcess,
+ gdbStart,
addInferior,
gdbSession,
) where
+import Control.Concurrent
+import Control.Concurrent.STM
import Control.Monad.IO.Class
+import Control.Monad.Reader
import Data.Text qualified as T
import Data.Text.IO qualified as T
@@ -15,29 +21,61 @@ import System.Process
import Output
import Process
+data GDB = GDB
+ { gdbProcess_ :: Process
+ }
+
+gdbProcess :: GDB -> Process
+gdbProcess = gdbProcess_
+
gdbCmd :: String
gdbCmd = "gdb --quiet --interpreter=mi3"
-gdbInit :: MonadIO m => Process -> m ()
-gdbInit gdb = do
- send gdb $ T.pack "-gdb-set schedule-multiple on"
- send gdb $ T.pack "-gdb-set mi-async on"
- send gdb $ T.pack "-gdb-set print symbol-loading off"
+gdbStart :: (MonadOutput m, MonadFail m) => m GDB
+gdbStart = do
+ (Just hin, Just hout, Just herr, handle) <- liftIO $ createProcess (shell gdbCmd)
+ { std_in = CreatePipe, std_out = CreatePipe, std_err = CreatePipe
+ }
+ pout <- liftIO $ newTVarIO []
+
+ let process = Process
+ { procName = ProcNameGDB
+ , procHandle = handle
+ , procStdin = hin
+ , procOutput = pout
+ , procKillWith = Nothing
+ , procNode = undefined
+ }
+ gdb = GDB
+ { gdbProcess_ = process
+ }
+
+ out <- getOutput
+ liftIO $ void $ forkIO $ flip runReaderT out $
+ lineReadingLoop process hout $ outProc OutputChildStdout process
+ liftIO $ void $ forkIO $ flip runReaderT out $
+ lineReadingLoop process herr $ outProc OutputChildStderr process
+
+ send process "-gdb-set schedule-multiple on"
+ send process "-gdb-set mi-async on"
+ send process "-gdb-set print symbol-loading off"
+
+ return gdb
-addInferior :: MonadIO m => Process -> Int -> Pid -> m ()
-addInferior gdb i pid = do
- send gdb $ T.pack $ "-add-inferior"
- send gdb $ T.pack $ "-target-attach --thread-group i" ++ show i ++ " " ++ show pid
- send gdb $ T.pack $ "-exec-continue --thread-group i" ++ show i
+addInferior :: MonadIO m => GDB -> Int -> Pid -> m ()
+addInferior GDB { gdbProcess_ = process } i pid = do
+ send process $ "-add-inferior"
+ send process $ "-target-attach --thread-group i" <> T.pack (show i) <> " " <> T.pack (show pid)
+ send process $ "-exec-continue --thread-group i" <> T.pack (show i)
-gdbSession :: MonadOutput m => Process -> m ()
+gdbSession :: MonadOutput m => GDB -> m ()
gdbSession gdb = do
- outPrompt $ T.pack "gdb> "
+ outPrompt "gdb> "
liftIO loop
outClearPrompt
where
loop = catchIOError (Just <$> T.getLine) (\e -> if isEOFError e then return Nothing else ioError e) >>= \case
Just line -> do
- send gdb (T.pack "-interpreter-exec console \"" `T.append` line `T.append` T.pack "\"")
+ send (gdbProcess gdb) ("-interpreter-exec console \"" <> line <> "\"")
loop
Nothing -> return ()