[Git][ghc/ghc][wip/T24040-ghci-timeout-squashed] fixing some wrongly used haddock syntax
Hassan Al-Awwadi (@hassan.awwadi)
gitlab at gitlab.haskell.org
Mon Feb 5 22:41:16 UTC 2024
Hassan Al-Awwadi pushed to branch wip/T24040-ghci-timeout-squashed at Glasgow Haskell Compiler / GHC
Commits:
083ae6ff by Hassan Al-Awwadi at 2024-02-05T23:09:40+01:00
fixing some wrongly used haddock syntax
- - - - -
1 changed file:
- ghc/GHCi/UI.hs
Changes:
=====================================
ghc/GHCi/UI.hs
=====================================
@@ -1118,8 +1118,8 @@ data GhciTimedOut = GhciTimedOut deriving Show
instance Exception GhciTimedOut
-- | Wraps a single run input action into a timout action, if the timelimit field has been set.
--- | Otherwise it just runs the action without doing anything.
--- | See Note [Where to Time]
+-- Otherwise it just runs the action without doing anything.
+-- See Note [Where to Time]
withTimeLimit :: (MonadIO m, MonadCatch m, GhciMonad m) => a -> m a -> m a
withTimeLimit time_out_value cmd = do
maybe_limit <- time_limit <$> getGHCiState
@@ -1131,12 +1131,12 @@ withTimeLimit time_out_value cmd = do
pure r where
-- | transitively duping System.Timeout(timeout), because we need a lifted version
- -- | transitively, because really this is a dupe of time-out's Control.Timeout(timeout)
- -- | Luckily time-out is in Public Domain
+ -- transitively, because really this is a dupe of time-out's Control.Timeout(timeout)
+ -- Luckily time-out is in Public Domain
timeout :: (MonadIO m, MonadCatch m) => Int -> m a -> m (Maybe a)
timeout time action = do
tidMain <- liftIO myThreadId
- -- | We might want to keep a single thread alive to reuse?
+ -- We might want to keep a single thread alive to reuse?
tidTemp <- liftIO $ forkIO $ delay time >> throwTo tidMain GhciTimedOut
result <- catchTimeout action `MC.onException` liftIO (killThread tidTemp)
when (isJust result) $ liftIO $ killThread tidTemp
@@ -1168,7 +1168,7 @@ runOneCommand eh gCmd = do
st <- getGHCiState
ghciHandle (\e -> lift $ eh e >>= return . Just) $
handleSourceError printErrorAndFail $
- withTimeLimit (Just False) $ cmd_wrapper st $ doCommand c -- ^ See Note [Where to Time]
+ withTimeLimit (Just False) $ cmd_wrapper st $ doCommand c -- See Note [Where to Time]
-- source error's are handled by runStmt
-- is the handler necessary here?
where
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/083ae6ff7d009fc71ad64d37618e314aabf30e6b
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/083ae6ff7d009fc71ad64d37618e314aabf30e6b
You're receiving this email because of your account on gitlab.haskell.org.
-------------- next part --------------
An HTML attachment was scrubbed...
URL: <http://mail.haskell.org/pipermail/ghc-commits/attachments/20240205/e0515afd/attachment-0001.html>
More information about the ghc-commits
mailing list