Skip to content

Commit 14f5528

Browse files
authored
Merge pull request #428 from vaerksted/master
fix typos
2 parents 3883438 + ada9183 commit 14f5528

File tree

8 files changed

+17
-17
lines changed

8 files changed

+17
-17
lines changed

old-testsuite/microsuite/Test.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -166,7 +166,7 @@ left_over_vector = compile "Data\\.Vector\\.Unboxed\\.Base\\.Vector" []
166166
-- > > readProcess "date" [] []
167167
-- > Right "Thu Feb 7 10:03:39 PST 2008\n"
168168
--
169-
-- The argumenst are:
169+
-- The arguments are:
170170
--
171171
-- * The command to run, which must be in the $PATH, or an absolute path
172172
--

vector-stream/src/Data/Stream/Monadic.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -1561,7 +1561,7 @@ enumFromTo_double n m = n `seq` m `seq` Stream step ini
15611561
lim = m + 1/2 -- important to float out
15621562

15631563
-- GHC changed definition of Enum for Double in GHC8.6 so we have to
1564-
-- accomodate both definitions in order to preserve validity of
1564+
-- accommodate both definitions in order to preserve validity of
15651565
-- rewrite rule
15661566
--
15671567
-- ISSUE: https://gitlab.haskell.org/ghc/ghc/issues/15081

vector/src/Data/Vector.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1483,14 +1483,14 @@ findIndices :: (a -> Bool) -> Vector a -> Vector Int
14831483
{-# INLINE findIndices #-}
14841484
findIndices = G.findIndices
14851485

1486-
-- | /O(n)/ Yield 'Just' the index of the first occurence of the given element or
1486+
-- | /O(n)/ Yield 'Just' the index of the first occurrence of the given element or
14871487
-- 'Nothing' if the vector does not contain the element. This is a specialised
14881488
-- version of 'findIndex'.
14891489
elemIndex :: Eq a => a -> Vector a -> Maybe Int
14901490
{-# INLINE elemIndex #-}
14911491
elemIndex = G.elemIndex
14921492

1493-
-- | /O(n)/ Yield the indices of all occurences of the given element in
1493+
-- | /O(n)/ Yield the indices of all occurrences of the given element in
14941494
-- ascending order. This is a specialised version of 'findIndices'.
14951495
elemIndices :: Eq a => a -> Vector a -> Vector Int
14961496
{-# INLINE elemIndices #-}
@@ -1563,7 +1563,7 @@ ifoldr' = G.ifoldr'
15631563

15641564
-- | /O(n)/ Map each element of the structure to a monoid and combine
15651565
-- the results. It uses the same implementation as the corresponding method
1566-
-- of the 'Foldable' type cless. Note that it's implemented in terms of 'foldr'
1566+
-- of the 'Foldable' type class. Note that it's implemented in terms of 'foldr'
15671567
-- and won't fuse with functions that traverse the vector from left to
15681568
-- right ('map', 'generate', etc.).
15691569
--

vector/src/Data/Vector/Fusion/Bundle/Monadic.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -732,7 +732,7 @@ postscanl' :: Monad m => (a -> b -> a) -> a -> Bundle m v b -> Bundle m v a
732732
{-# INLINE postscanl' #-}
733733
postscanl' f = postscanlM' (\a b -> return (f a b))
734734

735-
-- | Suffix scan with strict acccumulator and a monadic operator
735+
-- | Suffix scan with strict accumulator and a monadic operator
736736
postscanlM' :: Monad m => (a -> b -> m a) -> a -> Bundle m v b -> Bundle m v a
737737
{-# INLINE_FUSED postscanlM' #-}
738738
postscanlM' f z Bundle{sElems = s, sSize = sz} = fromStream (S.postscanlM' f z s) sz
@@ -1024,7 +1024,7 @@ enumFromTo_double n m = n `seq` m `seq` fromStream (Stream step ini) (Max (len n
10241024

10251025
{-# INLINE_INNER step #-}
10261026
-- GHC changed definition of Enum for Double in GHC8.6 so we have to
1027-
-- accomodate both definitions in order to preserve validity of
1027+
-- accommodate both definitions in order to preserve validity of
10281028
-- rewrite rule
10291029
--
10301030
-- ISSUE: https://gitlab.haskell.org/ghc/ghc/issues/15081

vector/src/Data/Vector/Generic.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1637,14 +1637,14 @@ findIndices f = unstream
16371637
. inplace (S.map fst . S.filter (f . snd) . S.indexed) toMax
16381638
. stream
16391639

1640-
-- | /O(n)/ Yield 'Just' the index of the first occurence of the given element or
1640+
-- | /O(n)/ Yield 'Just' the index of the first occurrence of the given element or
16411641
-- 'Nothing' if the vector does not contain the element. This is a specialised
16421642
-- version of 'findIndex'.
16431643
elemIndex :: (Vector v a, Eq a) => a -> v a -> Maybe Int
16441644
{-# INLINE elemIndex #-}
16451645
elemIndex x = findIndex (x ==)
16461646

1647-
-- | /O(n)/ Yield the indices of all occurences of the given element in
1647+
-- | /O(n)/ Yield the indices of all occurrences of the given element in
16481648
-- ascending order. This is a specialised version of 'findIndices'.
16491649
elemIndices :: (Vector v a, Vector v Int, Eq a) => a -> v a -> v Int
16501650
{-# INLINE elemIndices #-}

vector/src/Data/Vector/Primitive.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -1242,14 +1242,14 @@ findIndices :: Prim a => (a -> Bool) -> Vector a -> Vector Int
12421242
{-# INLINE findIndices #-}
12431243
findIndices = G.findIndices
12441244

1245-
-- | /O(n)/ Yield 'Just' the index of the first occurence of the given element or
1245+
-- | /O(n)/ Yield 'Just' the index of the first occurrence of the given element or
12461246
-- 'Nothing' if the vector does not contain the element. This is a specialised
12471247
-- version of 'findIndex'.
12481248
elemIndex :: (Prim a, Eq a) => a -> Vector a -> Maybe Int
12491249
{-# INLINE elemIndex #-}
12501250
elemIndex = G.elemIndex
12511251

1252-
-- | /O(n)/ Yield the indices of all occurences of the given element in
1252+
-- | /O(n)/ Yield the indices of all occurrences of the given element in
12531253
-- ascending order. This is a specialised version of 'findIndices'.
12541254
elemIndices :: (Prim a, Eq a) => a -> Vector a -> Vector Int
12551255
{-# INLINE elemIndices #-}

vector/src/Data/Vector/Storable.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1263,14 +1263,14 @@ findIndices :: Storable a => (a -> Bool) -> Vector a -> Vector Int
12631263
{-# INLINE findIndices #-}
12641264
findIndices = G.findIndices
12651265

1266-
-- | /O(n)/ Yield 'Just' the index of the first occurence of the given element or
1266+
-- | /O(n)/ Yield 'Just' the index of the first occurrence of the given element or
12671267
-- 'Nothing' if the vector does not contain the element. This is a specialised
12681268
-- version of 'findIndex'.
12691269
elemIndex :: (Storable a, Eq a) => a -> Vector a -> Maybe Int
12701270
{-# INLINE elemIndex #-}
12711271
elemIndex = G.elemIndex
12721272

1273-
-- | /O(n)/ Yield the indices of all occurences of the given element in
1273+
-- | /O(n)/ Yield the indices of all occurrences of the given element in
12741274
-- ascending order. This is a specialised version of 'findIndices'.
12751275
elemIndices :: (Storable a, Eq a) => a -> Vector a -> Vector Int
12761276
{-# INLINE elemIndices #-}
@@ -1343,7 +1343,7 @@ ifoldr' = G.ifoldr'
13431343

13441344
-- | /O(n)/ Map each element of the structure to a monoid and combine
13451345
-- the results. It uses the same implementation as the corresponding method
1346-
-- of the 'Foldable' type cless. Note that it's implemented in terms of 'foldr'
1346+
-- of the 'Foldable' type class. Note that it's implemented in terms of 'foldr'
13471347
-- and won't fuse with functions that traverse the vector from left to
13481348
-- right ('map', 'generate', etc.).
13491349
--

vector/src/Data/Vector/Unboxed.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -1142,7 +1142,7 @@ dropWhile :: Unbox a => (a -> Bool) -> Vector a -> Vector a
11421142
{-# INLINE dropWhile #-}
11431143
dropWhile = G.dropWhile
11441144

1145-
-- Parititioning
1145+
-- Partitioning
11461146
-- -------------
11471147

11481148
-- | /O(n)/ Split the vector in two parts, the first one containing those
@@ -1253,14 +1253,14 @@ findIndices :: Unbox a => (a -> Bool) -> Vector a -> Vector Int
12531253
{-# INLINE findIndices #-}
12541254
findIndices = G.findIndices
12551255

1256-
-- | /O(n)/ Yield 'Just' the index of the first occurence of the given element or
1256+
-- | /O(n)/ Yield 'Just' the index of the first occurrence of the given element or
12571257
-- 'Nothing' if the vector does not contain the element. This is a specialised
12581258
-- version of 'findIndex'.
12591259
elemIndex :: (Unbox a, Eq a) => a -> Vector a -> Maybe Int
12601260
{-# INLINE elemIndex #-}
12611261
elemIndex = G.elemIndex
12621262

1263-
-- | /O(n)/ Yield the indices of all occurences of the given element in
1263+
-- | /O(n)/ Yield the indices of all occurrences of the given element in
12641264
-- ascending order. This is a specialised version of 'findIndices'.
12651265
elemIndices :: (Unbox a, Eq a) => a -> Vector a -> Vector Int
12661266
{-# INLINE elemIndices #-}

0 commit comments

Comments
 (0)