Skip to content

Commit d8bc9b9

Browse files
authored
Merge pull request #52 from adamse/master
Fix words in haddocks
2 parents b2bdd73 + e17559c commit d8bc9b9

File tree

5 files changed

+20
-20
lines changed

5 files changed

+20
-20
lines changed

Data/Vector.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -365,12 +365,12 @@ instance Traversable.Traversable Vector where
365365
-- Length information
366366
-- ------------------
367367

368-
-- | /O(1)/ Yield the length of the vector.
368+
-- | /O(1)/ Yield the length of the vector
369369
length :: Vector a -> Int
370370
{-# INLINE length #-}
371371
length = G.length
372372

373-
-- | /O(1)/ Test whether a vector if empty
373+
-- | /O(1)/ Test whether a vector is empty
374374
null :: Vector a -> Bool
375375
{-# INLINE null #-}
376376
null = G.null
@@ -588,8 +588,8 @@ unfoldr :: (b -> Maybe (a, b)) -> b -> Vector a
588588
{-# INLINE unfoldr #-}
589589
unfoldr = G.unfoldr
590590

591-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
592-
-- generator function to the a seed. The generator function yields 'Just' the
591+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
592+
-- the generator function to a seed. The generator function yields 'Just' the
593593
-- next element and the new seed or 'Nothing' if there are no more elements.
594594
--
595595
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>

Data/Vector/Generic.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -218,12 +218,12 @@ mkNoRepType = mkNorepType
218218
-- Length information
219219
-- ------------------
220220

221-
-- | /O(1)/ Yield the length of the vector.
221+
-- | /O(1)/ Yield the length of the vector
222222
length :: Vector v a => v a -> Int
223223
{-# INLINE length #-}
224224
length = Bundle.length . stream
225225

226-
-- | /O(1)/ Test whether a vector if empty
226+
-- | /O(1)/ Test whether a vector is empty
227227
null :: Vector v a => v a -> Bool
228228
{-# INLINE null #-}
229229
null = Bundle.null . stream
@@ -538,8 +538,8 @@ unfoldr :: Vector v a => (b -> Maybe (a, b)) -> b -> v a
538538
{-# INLINE unfoldr #-}
539539
unfoldr f = unstream . Bundle.unfoldr f
540540

541-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
542-
-- generator function to the a seed. The generator function yields 'Just' the
541+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
542+
-- the generator function to a seed. The generator function yields 'Just' the
543543
-- next element and the new seed or 'Nothing' if there are no more elements.
544544
--
545545
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>

Data/Vector/Primitive.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -280,12 +280,12 @@ instance Prim a => Exts.IsList (Vector a) where
280280
-- Length
281281
-- ------
282282

283-
-- | /O(1)/ Yield the length of the vector.
283+
-- | /O(1)/ Yield the length of the vector
284284
length :: Prim a => Vector a -> Int
285285
{-# INLINE length #-}
286286
length = G.length
287287

288-
-- | /O(1)/ Test whether a vector if empty
288+
-- | /O(1)/ Test whether a vector is empty
289289
null :: Prim a => Vector a -> Bool
290290
{-# INLINE null #-}
291291
null = G.null
@@ -504,8 +504,8 @@ unfoldr :: Prim a => (b -> Maybe (a, b)) -> b -> Vector a
504504
{-# INLINE unfoldr #-}
505505
unfoldr = G.unfoldr
506506

507-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
508-
-- generator function to the a seed. The generator function yields 'Just' the
507+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
508+
-- the generator function to a seed. The generator function yields 'Just' the
509509
-- next element and the new seed or 'Nothing' if there are no more elements.
510510
--
511511
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>

Data/Vector/Storable.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -290,12 +290,12 @@ instance Storable a => Exts.IsList (Vector a) where
290290
-- Length
291291
-- ------
292292

293-
-- | /O(1)/ Yield the length of the vector.
293+
-- | /O(1)/ Yield the length of the vector
294294
length :: Storable a => Vector a -> Int
295295
{-# INLINE length #-}
296296
length = G.length
297297

298-
-- | /O(1)/ Test whether a vector if empty
298+
-- | /O(1)/ Test whether a vector is empty
299299
null :: Storable a => Vector a -> Bool
300300
{-# INLINE null #-}
301301
null = G.null
@@ -514,8 +514,8 @@ unfoldr :: Storable a => (b -> Maybe (a, b)) -> b -> Vector a
514514
{-# INLINE unfoldr #-}
515515
unfoldr = G.unfoldr
516516

517-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
518-
-- generator function to the a seed. The generator function yields 'Just' the
517+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
518+
-- the generator function to a seed. The generator function yields 'Just' the
519519
-- next element and the new seed or 'Nothing' if there are no more elements.
520520
--
521521
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>

Data/Vector/Unboxed.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -260,12 +260,12 @@ instance (Unbox e) => Exts.IsList (Vector e) where
260260
-- Length information
261261
-- ------------------
262262

263-
-- | /O(1)/ Yield the length of the vector.
263+
-- | /O(1)/ Yield the length of the vector
264264
length :: Unbox a => Vector a -> Int
265265
{-# INLINE length #-}
266266
length = G.length
267267

268-
-- | /O(1)/ Test whether a vector if empty
268+
-- | /O(1)/ Test whether a vector is empty
269269
null :: Unbox a => Vector a -> Bool
270270
{-# INLINE null #-}
271271
null = G.null
@@ -483,8 +483,8 @@ unfoldr :: Unbox a => (b -> Maybe (a, b)) -> b -> Vector a
483483
{-# INLINE unfoldr #-}
484484
unfoldr = G.unfoldr
485485

486-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
487-
-- generator function to the a seed. The generator function yields 'Just' the
486+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
487+
-- the generator function to a seed. The generator function yields 'Just' the
488488
-- next element and the new seed or 'Nothing' if there are no more elements.
489489
--
490490
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>

0 commit comments

Comments
 (0)