Skip to content

Commit b8cac2c

Browse files
committed
Fix words in haddocks
1 parent c0308f1 commit b8cac2c

File tree

5 files changed

+30
-25
lines changed

5 files changed

+30
-25
lines changed

Data/Vector.hs

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -352,12 +352,12 @@ instance Traversable.Traversable Vector where
352352
-- Length information
353353
-- ------------------
354354

355-
-- | /O(1)/ Yield the length of the vector.
355+
-- | /O(1)/ Yield the length of the vector
356356
length :: Vector a -> Int
357357
{-# INLINE length #-}
358358
length = G.length
359359

360-
-- | /O(1)/ Test whether a vector if empty
360+
-- | /O(1)/ Test whether a vector is empty
361361
null :: Vector a -> Bool
362362
{-# INLINE null #-}
363363
null = G.null
@@ -575,9 +575,10 @@ unfoldr :: (b -> Maybe (a, b)) -> b -> Vector a
575575
{-# INLINE unfoldr #-}
576576
unfoldr = G.unfoldr
577577

578-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
579-
-- generator function to the a seed. The generator function yields 'Just' the
580-
-- next element and the new seed or 'Nothing' if there are no more elements.
578+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
579+
-- the generator function to the a seed. The generator function yields 'Just'
580+
-- the next element and the new seed or 'Nothing' if there are no more
581+
-- elements.
581582
--
582583
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>
583584
unfoldrN :: Int -> (b -> Maybe (a, b)) -> b -> Vector a

Data/Vector/Generic.hs

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -215,12 +215,12 @@ mkNoRepType = mkNorepType
215215
-- Length information
216216
-- ------------------
217217

218-
-- | /O(1)/ Yield the length of the vector.
218+
-- | /O(1)/ Yield the length of the vector
219219
length :: Vector v a => v a -> Int
220220
{-# INLINE length #-}
221221
length = Bundle.length . stream
222222

223-
-- | /O(1)/ Test whether a vector if empty
223+
-- | /O(1)/ Test whether a vector is empty
224224
null :: Vector v a => v a -> Bool
225225
{-# INLINE null #-}
226226
null = Bundle.null . stream
@@ -535,9 +535,10 @@ unfoldr :: Vector v a => (b -> Maybe (a, b)) -> b -> v a
535535
{-# INLINE unfoldr #-}
536536
unfoldr f = unstream . Bundle.unfoldr f
537537

538-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
539-
-- generator function to the a seed. The generator function yields 'Just' the
540-
-- next element and the new seed or 'Nothing' if there are no more elements.
538+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
539+
-- the generator function to the a seed. The generator function yields 'Just'
540+
-- the next element and the new seed or 'Nothing' if there are no more
541+
-- elements.
541542
--
542543
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>
543544
unfoldrN :: Vector v a => Int -> (b -> Maybe (a, b)) -> b -> v a

Data/Vector/Primitive.hs

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -269,12 +269,12 @@ instance Prim a => Exts.IsList (Vector a) where
269269
-- Length
270270
-- ------
271271

272-
-- | /O(1)/ Yield the length of the vector.
272+
-- | /O(1)/ Yield the length of the vector
273273
length :: Prim a => Vector a -> Int
274274
{-# INLINE length #-}
275275
length = G.length
276276

277-
-- | /O(1)/ Test whether a vector if empty
277+
-- | /O(1)/ Test whether a vector is empty
278278
null :: Prim a => Vector a -> Bool
279279
{-# INLINE null #-}
280280
null = G.null
@@ -493,9 +493,10 @@ unfoldr :: Prim a => (b -> Maybe (a, b)) -> b -> Vector a
493493
{-# INLINE unfoldr #-}
494494
unfoldr = G.unfoldr
495495

496-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
497-
-- generator function to the a seed. The generator function yields 'Just' the
498-
-- next element and the new seed or 'Nothing' if there are no more elements.
496+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
497+
-- the generator function to the a seed. The generator function yields 'Just'
498+
-- the next element and the new seed or 'Nothing' if there are no more
499+
-- elements.
499500
--
500501
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>
501502
unfoldrN :: Prim a => Int -> (b -> Maybe (a, b)) -> b -> Vector a

Data/Vector/Storable.hs

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -279,12 +279,12 @@ instance Storable a => Exts.IsList (Vector a) where
279279
-- Length
280280
-- ------
281281

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

287-
-- | /O(1)/ Test whether a vector if empty
287+
-- | /O(1)/ Test whether a vector is empty
288288
null :: Storable a => Vector a -> Bool
289289
{-# INLINE null #-}
290290
null = G.null
@@ -503,9 +503,10 @@ unfoldr :: Storable a => (b -> Maybe (a, b)) -> b -> Vector a
503503
{-# INLINE unfoldr #-}
504504
unfoldr = G.unfoldr
505505

506-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
507-
-- generator function to the a seed. The generator function yields 'Just' the
508-
-- next element and the new seed or 'Nothing' if there are no more elements.
506+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
507+
-- the generator function to the a seed. The generator function yields 'Just'
508+
-- the next element and the new seed or 'Nothing' if there are no more
509+
-- elements.
509510
--
510511
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>
511512
unfoldrN :: Storable a => Int -> (b -> Maybe (a, b)) -> b -> Vector a

Data/Vector/Unboxed.hs

Lines changed: 6 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -250,12 +250,12 @@ instance (Unbox e) => Exts.IsList (Vector e) where
250250
-- Length information
251251
-- ------------------
252252

253-
-- | /O(1)/ Yield the length of the vector.
253+
-- | /O(1)/ Yield the length of the vector
254254
length :: Unbox a => Vector a -> Int
255255
{-# INLINE length #-}
256256
length = G.length
257257

258-
-- | /O(1)/ Test whether a vector if empty
258+
-- | /O(1)/ Test whether a vector is empty
259259
null :: Unbox a => Vector a -> Bool
260260
{-# INLINE null #-}
261261
null = G.null
@@ -473,9 +473,10 @@ unfoldr :: Unbox a => (b -> Maybe (a, b)) -> b -> Vector a
473473
{-# INLINE unfoldr #-}
474474
unfoldr = G.unfoldr
475475

476-
-- | /O(n)/ Construct a vector with at most @n@ by repeatedly applying the
477-
-- generator function to the a seed. The generator function yields 'Just' the
478-
-- next element and the new seed or 'Nothing' if there are no more elements.
476+
-- | /O(n)/ Construct a vector with at most @n@ elements by repeatedly applying
477+
-- the generator function to the a seed. The generator function yields 'Just'
478+
-- the next element and the new seed or 'Nothing' if there are no more
479+
-- elements.
479480
--
480481
-- > unfoldrN 3 (\n -> Just (n,n-1)) 10 = <10,9,8>
481482
unfoldrN :: Unbox a => Int -> (b -> Maybe (a, b)) -> b -> Vector a

0 commit comments

Comments
 (0)