Repository : ssh://darcs.haskell.org//srv/darcs/packages/vector

On branch  : 

http://hackage.haskell.org/trac/ghc/changeset/e4f1a8ca888118ff901820a0e4febecf4f3636f2

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

commit e4f1a8ca888118ff901820a0e4febecf4f3636f2
Author: Roman Leshchinskiy <[email protected]>
Date:   Mon May 16 20:05:46 2011 +0000

    Fix doc typo

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

 Data/Vector.hs           |    2 +-
 Data/Vector/Generic.hs   |    2 +-
 Data/Vector/Primitive.hs |    2 +-
 Data/Vector/Storable.hs  |    2 +-
 Data/Vector/Unboxed.hs   |    2 +-
 5 files changed, 5 insertions(+), 5 deletions(-)

diff --git a/Data/Vector.hs b/Data/Vector.hs
index 48a0e7f..eae0f0f 100644
--- a/Data/Vector.hs
+++ b/Data/Vector.hs
@@ -1181,7 +1181,7 @@ foldM' :: Monad m => (a -> b -> m a) -> a -> Vector b -> 
m a
 {-# INLINE foldM' #-}
 foldM' = G.foldM'
 
--- | /O(n)/ Monad fold over non-empty vectors with strict accumulator
+-- | /O(n)/ Monadic fold over non-empty vectors with strict accumulator
 fold1M' :: Monad m => (a -> a -> m a) -> Vector a -> m a
 {-# INLINE fold1M' #-}
 fold1M' = G.fold1M'
diff --git a/Data/Vector/Generic.hs b/Data/Vector/Generic.hs
index 1bdcb63..49e94f9 100644
--- a/Data/Vector/Generic.hs
+++ b/Data/Vector/Generic.hs
@@ -1468,7 +1468,7 @@ foldM' :: (Monad m, Vector v b) => (a -> b -> m a) -> a 
-> v b -> m a
 {-# INLINE foldM' #-}
 foldM' m z = Stream.foldM' m z . stream
 
--- | /O(n)/ Monad fold over non-empty vectors with strict accumulator
+-- | /O(n)/ Monadic fold over non-empty vectors with strict accumulator
 fold1M' :: (Monad m, Vector v a) => (a -> a -> m a) -> v a -> m a
 {-# INLINE fold1M' #-}
 fold1M' m = Stream.fold1M' m . stream
diff --git a/Data/Vector/Primitive.hs b/Data/Vector/Primitive.hs
index 6ffa72a..5bb5726 100644
--- a/Data/Vector/Primitive.hs
+++ b/Data/Vector/Primitive.hs
@@ -1083,7 +1083,7 @@ foldM' :: (Monad m, Prim b) => (a -> b -> m a) -> a -> 
Vector b -> m a
 {-# INLINE foldM' #-}
 foldM' = G.foldM'
 
--- | /O(n)/ Monad fold over non-empty vectors with strict accumulator
+-- | /O(n)/ Monadic fold over non-empty vectors with strict accumulator
 fold1M' :: (Monad m, Prim a) => (a -> a -> m a) -> Vector a -> m a
 {-# INLINE fold1M' #-}
 fold1M' = G.fold1M'
diff --git a/Data/Vector/Storable.hs b/Data/Vector/Storable.hs
index b820dba..7f76ebb 100644
--- a/Data/Vector/Storable.hs
+++ b/Data/Vector/Storable.hs
@@ -1102,7 +1102,7 @@ foldM' :: (Monad m, Storable b) => (a -> b -> m a) -> a 
-> Vector b -> m a
 {-# INLINE foldM' #-}
 foldM' = G.foldM'
 
--- | /O(n)/ Monad fold over non-empty vectors with strict accumulator
+-- | /O(n)/ Monadic fold over non-empty vectors with strict accumulator
 fold1M' :: (Monad m, Storable a) => (a -> a -> m a) -> Vector a -> m a
 {-# INLINE fold1M' #-}
 fold1M' = G.fold1M'
diff --git a/Data/Vector/Unboxed.hs b/Data/Vector/Unboxed.hs
index 3753c98..7d65408 100644
--- a/Data/Vector/Unboxed.hs
+++ b/Data/Vector/Unboxed.hs
@@ -1123,7 +1123,7 @@ foldM' :: (Monad m, Unbox b) => (a -> b -> m a) -> a -> 
Vector b -> m a
 {-# INLINE foldM' #-}
 foldM' = G.foldM'
 
--- | /O(n)/ Monad fold over non-empty vectors with strict accumulator
+-- | /O(n)/ Monadic fold over non-empty vectors with strict accumulator
 fold1M' :: (Monad m, Unbox a) => (a -> a -> m a) -> Vector a -> m a
 {-# INLINE fold1M' #-}
 fold1M' = G.fold1M'



_______________________________________________
Cvs-libraries mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-libraries

Reply via email to