module GHC.ExecutionStack.Internal (
Location (..)
, SrcLoc (..)
, StackTrace
, stackFrames
, stackDepth
, collectStackTrace
, showStackFrames
, invalidateDebugCache
) where
import Control.Monad (join)
import Data.Word
import Foreign.C.Types
import Foreign.C.String (peekCString, CString)
import Foreign.Ptr (Ptr, nullPtr, castPtr, plusPtr, FunPtr)
import Foreign.ForeignPtr
import Foreign.Marshal.Alloc (allocaBytes)
import Foreign.Storable (Storable(..))
import System.IO.Unsafe (unsafePerformIO, unsafeInterleaveIO)
data SrcLoc = SrcLoc { sourceFile :: String
, sourceLine :: Int
, sourceColumn :: Int
}
data Location = Location { objectName :: String
, functionName :: String
, srcLoc :: Maybe SrcLoc
}
data Chunk = Chunk { chunkFrames :: !Word
, chunkNext :: !(Ptr Chunk)
, chunkFirstFrame :: !(Ptr Addr)
}
newtype StackTrace = StackTrace (ForeignPtr StackTrace)
type Addr = Ptr ()
withSession :: (ForeignPtr Session -> IO a) -> IO (Maybe a)
withSession action = do
ptr <- libdw_pool_take
if | nullPtr == ptr -> return Nothing
| otherwise -> do
fptr <- newForeignPtr libdw_pool_release ptr
ret <- action fptr
return $ Just ret
stackDepth :: StackTrace -> Int
stackDepth (StackTrace fptr) =
unsafePerformIO $ withForeignPtr fptr $ \ptr ->
fromIntegral . asWord <$> ((\hsc_ptr -> peekByteOff hsc_ptr 0)) ptr
where
asWord = id :: Word -> Word
peekChunk :: Ptr Chunk -> IO Chunk
peekChunk ptr =
Chunk <$> ((\hsc_ptr -> peekByteOff hsc_ptr 0)) ptr
<*> ((\hsc_ptr -> peekByteOff hsc_ptr 8)) ptr
<*> pure (castPtr $ ((\hsc_ptr -> hsc_ptr `plusPtr` 16)) ptr)
chunksList :: StackTrace -> IO [Chunk]
chunksList (StackTrace fptr) = withForeignPtr fptr $ \ptr ->
go [] =<< ((\hsc_ptr -> peekByteOff hsc_ptr 8)) ptr
where
go accum ptr
| ptr == nullPtr = return accum
| otherwise = do
chunk <- peekChunk ptr
go (chunk : accum) (chunkNext chunk)
peekLocation :: Ptr Location -> IO Location
peekLocation ptr = do
let peekCStringPtr :: CString -> IO String
peekCStringPtr p
| p /= nullPtr = peekCString $ castPtr p
| otherwise = return ""
objFile <- peekCStringPtr =<< ((\hsc_ptr -> peekByteOff hsc_ptr 0)) ptr
function <- peekCStringPtr =<< ((\hsc_ptr -> peekByteOff hsc_ptr 8)) ptr
srcFile <- peekCStringPtr =<< ((\hsc_ptr -> peekByteOff hsc_ptr 16)) ptr
lineNo <- ((\hsc_ptr -> peekByteOff hsc_ptr 24)) ptr :: IO Word32
colNo <- ((\hsc_ptr -> peekByteOff hsc_ptr 28)) ptr :: IO Word32
let _srcLoc
| null srcFile = Nothing
| otherwise = Just $ SrcLoc { sourceFile = srcFile
, sourceLine = fromIntegral lineNo
, sourceColumn = fromIntegral colNo
}
return Location { objectName = objFile
, functionName = function
, srcLoc = _srcLoc
}
locationSize :: Int
locationSize = (32)
stackFrames :: StackTrace -> Maybe [Location]
stackFrames st@(StackTrace fptr) = unsafePerformIO $ withSession $ \sess -> do
chunks <- chunksList st
go sess (reverse chunks)
where
go :: ForeignPtr Session -> [Chunk] -> IO [Location]
go _ [] = return []
go sess (chunk : chunks) = do
this <- iterChunk sess chunk
rest <- unsafeInterleaveIO (go sess chunks)
return (this ++ rest)
iterChunk :: ForeignPtr Session -> Chunk -> IO [Location]
iterChunk sess chunk = iterFrames (chunkFrames chunk) (chunkFirstFrame chunk)
where
iterFrames :: Word -> Ptr Addr -> IO [Location]
iterFrames 0 _ = return []
iterFrames n frame = do
pc <- peek frame :: IO Addr
mframe <- lookupFrame pc
rest <- unsafeInterleaveIO (iterFrames (n1) frame')
return $ maybe rest (:rest) mframe
where
frame' = frame `plusPtr` sizeOf (undefined :: Addr)
lookupFrame :: Addr -> IO (Maybe Location)
lookupFrame pc = withForeignPtr fptr $ const $ do
allocaBytes locationSize $ \buf -> do
ret <- withForeignPtr sess $ \sessPtr -> libdw_lookup_location sessPtr buf pc
case ret of
0 -> Just <$> peekLocation buf
_ -> return Nothing
data Session
foreign import ccall unsafe "libdwPoolTake"
libdw_pool_take :: IO (Ptr Session)
foreign import ccall unsafe "&libdwPoolRelease"
libdw_pool_release :: FunPtr (Ptr Session -> IO ())
foreign import ccall unsafe "libdwPoolClear"
libdw_pool_clear :: IO ()
foreign import ccall unsafe "libdwLookupLocation"
libdw_lookup_location :: Ptr Session -> Ptr Location -> Addr -> IO CInt
foreign import ccall unsafe "libdwGetBacktrace"
libdw_get_backtrace :: Ptr Session -> IO (Ptr StackTrace)
foreign import ccall unsafe "&backtraceFree"
backtrace_free :: FunPtr (Ptr StackTrace -> IO ())
collectStackTrace :: IO (Maybe StackTrace)
collectStackTrace = fmap join $ withSession $ \sess -> do
st <- withForeignPtr sess libdw_get_backtrace
if | st == nullPtr -> return Nothing
| otherwise -> Just . StackTrace <$> newForeignPtr backtrace_free st
invalidateDebugCache :: IO ()
invalidateDebugCache = libdw_pool_clear
showStackFrames :: [Location] -> ShowS
showStackFrames frames =
showString "Stack trace:\n"
. foldr (.) id (map showFrame frames)
where
showFrame loc =
showString " " . showLocation loc . showChar '\n'
showLocation :: Location -> ShowS
showLocation loc =
showString (functionName loc)
. maybe id showSrcLoc (srcLoc loc)
. showString " in "
. showString (objectName loc)
where
showSrcLoc :: SrcLoc -> ShowS
showSrcLoc sloc =
showString " ("
. showString (sourceFile sloc)
. showString ":"
. shows (sourceLine sloc)
. showString "."
. shows (sourceColumn sloc)
. showString ")"