[commit: ghc] master: Duplicated and (261209d)

git at git.haskell.org git at git.haskell.org
Thu Jun 14 14:04:58 UTC 2018


Repository : ssh://git@git.haskell.org/ghc

On branch  : master
Link       : http://ghc.haskell.org/trac/ghc/changeset/261209d1f7d33a124b97c0f59412ae62ff9c1ca8/ghc

>---------------------------------------------------------------

commit 261209d1f7d33a124b97c0f59412ae62ff9c1ca8
Author: Gabor Greif <ggreif at gmail.com>
Date:   Fri Jun 8 18:24:47 2018 +0200

    Duplicated and


>---------------------------------------------------------------

261209d1f7d33a124b97c0f59412ae62ff9c1ca8
 libraries/base/Data/Traversable.hs | 2 +-
 1 file changed, 1 insertion(+), 1 deletion(-)

diff --git a/libraries/base/Data/Traversable.hs b/libraries/base/Data/Traversable.hs
index cb205cf..bed2ef9 100644
--- a/libraries/base/Data/Traversable.hs
+++ b/libraries/base/Data/Traversable.hs
@@ -164,7 +164,7 @@ class (Functor t, Foldable t) => Traversable t where
     traverse f = sequenceA . fmap f
 
     -- | Evaluate each action in the structure from left to right, and
-    -- and collect the results. For a version that ignores the results
+    -- collect the results. For a version that ignores the results
     -- see 'Data.Foldable.sequenceA_'.
     sequenceA :: Applicative f => t (f a) -> f (t a)
     {-# INLINE sequenceA #-}  -- See Note [Inline default methods]



More information about the ghc-commits mailing list