{-# LANGUAGE CPP #-}
module UI.HSCurses.Logging (trace, debug) where
import Control.Monad.Trans
#if DEBUG
import System.IO
import System.IO.Unsafe (unsafePerformIO)
import qualified Data.Time as Time
#endif
trace :: String -> a -> a
debug :: (MonadIO m) => String -> m ()
#if DEBUG
logFile :: Handle
logFile = unsafePerformIO $ do h <- openFile ".hscurses.log" AppendMode
debug_ h "logging initialized"
return h
{-# NOINLINE logFile #-}
formatTime :: IO String
formatTime = do
let fmt = "%Y-%m-%d %H:%M:%S%03Q"
now <- Time.getZonedTime
return $ Time.formatTime Time.defaultTimeLocale fmt now
debug_ :: Handle -> String -> IO ()
debug_ f s =
do ts <- formatTime
hPutStrLn f ("[" ++ ts ++ "] " ++ s)
hFlush f
trace s x =
unsafePerformIO $ do debug s
return x
debug s = liftIO $ debug_ logFile s
#else
trace :: forall a. String -> a -> a
trace String
_ a
x = a
x
debug :: forall (m :: * -> *). MonadIO m => String -> m ()
debug String
_ = () -> m ()
forall a. a -> m a
forall (m :: * -> *) a. Monad m => a -> m a
return ()
#endif