[commit: vector] simd: Fix docs (f2b0015)
Geoffrey Mainland
gmainlan at ghc.haskell.org
Fri Jul 19 14:23:39 CEST 2013
Repository : http://darcs.haskell.org/ghc.git/
On branch : simd
http://hackage.haskell.org/trac/ghc/changeset/f2b0015328fde5f1c947986d0a02e2ae12f157d0
>---------------------------------------------------------------
commit f2b0015328fde5f1c947986d0a02e2ae12f157d0
Author: Roman Leshchinskiy <rl at cse.unsw.edu.au>
Date: Wed Jan 25 23:30:10 2012 +0000
Fix docs
>---------------------------------------------------------------
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 7fac580..3b38d69 100644
--- a/Data/Vector.hs
+++ b/Data/Vector.hs
@@ -650,7 +650,7 @@ generateM = G.generateM
-- | Execute the monadic action and freeze the resulting vector.
--
-- @
--- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\' }) = \<'a','b'\>
+-- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\'; return v }) = \<'a','b'\>
-- @
create :: (forall s. ST s (MVector s a)) -> Vector a
{-# INLINE create #-}
diff --git a/Data/Vector/Generic.hs b/Data/Vector/Generic.hs
index 35acc3d..53e2daa 100644
--- a/Data/Vector/Generic.hs
+++ b/Data/Vector/Generic.hs
@@ -712,7 +712,7 @@ generateM n f = unstreamM (MStream.generateM n f)
-- | Execute the monadic action and freeze the resulting vector.
--
-- @
--- create (do { v \<- 'M.new' 2; 'M.write' v 0 \'a\'; 'M.write' v 1 \'b\' }) = \<'a','b'\>
+-- create (do { v \<- 'M.new' 2; 'M.write' v 0 \'a\'; 'M.write' v 1 \'b\'; return v }) = \<'a','b'\>
-- @
create :: Vector v a => (forall s. ST s (Mutable v s a)) -> v a
{-# INLINE create #-}
diff --git a/Data/Vector/Primitive.hs b/Data/Vector/Primitive.hs
index 5f0e62e..f6eb42b 100644
--- a/Data/Vector/Primitive.hs
+++ b/Data/Vector/Primitive.hs
@@ -583,7 +583,7 @@ generateM = G.generateM
-- | Execute the monadic action and freeze the resulting vector.
--
-- @
--- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\' }) = \<'a','b'\>
+-- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\'; return v }) = \<'a','b'\>
-- @
create :: Prim a => (forall s. ST s (MVector s a)) -> Vector a
{-# INLINE create #-}
diff --git a/Data/Vector/Storable.hs b/Data/Vector/Storable.hs
index ebb68e1..5f88580 100644
--- a/Data/Vector/Storable.hs
+++ b/Data/Vector/Storable.hs
@@ -590,7 +590,7 @@ generateM = G.generateM
-- | Execute the monadic action and freeze the resulting vector.
--
-- @
--- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\' }) = \<'a','b'\>
+-- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\'; return v }) = \<'a','b'\>
-- @
create :: Storable a => (forall s. ST s (MVector s a)) -> Vector a
{-# INLINE create #-}
diff --git a/Data/Vector/Unboxed.hs b/Data/Vector/Unboxed.hs
index 8198a60..d8bc8db 100644
--- a/Data/Vector/Unboxed.hs
+++ b/Data/Vector/Unboxed.hs
@@ -563,7 +563,7 @@ generateM = G.generateM
-- | Execute the monadic action and freeze the resulting vector.
--
-- @
--- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\' }) = \<'a','b'\>
+-- create (do { v \<- new 2; write v 0 \'a\'; write v 1 \'b\'; return v }) = \<'a','b'\>
-- @
create :: Unbox a => (forall s. ST s (MVector s a)) -> Vector a
{-# INLINE create #-}
More information about the ghc-commits
mailing list