[Git][ghc/ghc][master] docs: fix haddock formatting in Control.Monad.Fix
Marge Bot (@marge-bot)
gitlab at gitlab.haskell.org
Thu Dec 26 15:49:01 UTC 2024
Marge Bot pushed to branch master at Glasgow Haskell Compiler / GHC
Commits:
6bf0d587 by Andrew Lelechenko at 2024-12-26T10:48:33-05:00
docs: fix haddock formatting in Control.Monad.Fix
- - - - -
1 changed file:
- libraries/base/src/Control/Monad/Fix.hs
Changes:
=====================================
libraries/base/src/Control/Monad/Fix.hs
=====================================
@@ -56,7 +56,7 @@
-- :: (Traversable t, Monoid b, Monad m)
-- => (a -> b) -> (a -> b -> m c) -> t a -> m (t c)
-- repminM f g as = do
--- (b, cs) \<- mapAccumM (\\acc a -> (f a <> acc,) <$> g a b) mempty as
+-- (b, cs) \<- mapAccumM (\\acc a -> (f a <> acc,) \<$\> g a b) mempty as
-- pure cs
-- @
--
@@ -77,7 +77,7 @@
-- :: (Traversable t, Monoid b, MonadFix m)
-- => (a -> b) -> (a -> b -> m c) -> t a -> m (t c)
-- repminM f g as = fmap snd $ mfix $
--- \\(~(b, cs)) -> mapAccumM (\\acc a -> (f a <> acc,) <$> g a b) mempty as
+-- \\(~(b, cs)) -> mapAccumM (\\acc a -> (f a <> acc,) \<$\> g a b) mempty as
-- @
--
-- For example,
@@ -90,7 +90,7 @@
-- [13,15,12]
--
-- Incredibly, GHC is capable to do this transformation automatically,
--- when {-# LANGUAGE RecursiveDo #-} is enabled. Namely, the following
+-- when @{-# LANGUAGE RecursiveDo #-}@ is enabled. Namely, the following
-- implementation of @repminM@ works (note @mdo@ instead of @do@):
--
-- @
@@ -100,7 +100,7 @@
-- :: (Traversable t, Monoid b, MonadFix m)
-- => (a -> b) -> (a -> b -> m c) -> t a -> m (t c)
-- repminM f g as = mdo
--- (b, cs) \<- mapAccumM (\\acc a -> (f a <> acc,) <$> g a b) mempty as
+-- (b, cs) \<- mapAccumM (\\acc a -> (f a <> acc,) \<$\> g a b) mempty as
-- pure cs
-- @
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/6bf0d58759ac6787000e101c05b7e73eaebfa5af
--
View it on GitLab: https://gitlab.haskell.org/ghc/ghc/-/commit/6bf0d58759ac6787000e101c05b7e73eaebfa5af
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/20241226/b883ef8b/attachment-0001.html>
More information about the ghc-commits
mailing list