Skip to content

Commit 91769ab

Browse files
authored
Merge pull request #10613 from cabalism/typos/in-hs-files
Fix typos in `*.hs` files
2 parents daa6ffa + 02a9724 commit 91769ab

File tree

32 files changed

+60
-60
lines changed

32 files changed

+60
-60
lines changed

Cabal-syntax/src/Distribution/Backpack.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -70,7 +70,7 @@ import qualified Data.Set as Set
7070
-- represent it as a 'DefiniteUnitId uid'.
7171
--
7272
-- For a source component using Backpack, however, there is more
73-
-- structure as components may be parametrized over some signatures, and
73+
-- structure as components may be parameterized over some signatures, and
7474
-- these \"holes\" may be partially or wholly filled.
7575
--
7676
-- OpenUnitId plays an important role when we are mix-in linking,

Cabal-syntax/src/Distribution/Fields/Field.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -6,7 +6,7 @@
66

77
-- | Cabal-like file AST types: 'Field', 'Section' etc
88
--
9-
-- These types are parametrized by an annotation.
9+
-- These types are parameterized by an annotation.
1010
module Distribution.Fields.Field
1111
( -- * Cabal file
1212
Field (..)

Cabal-syntax/src/Distribution/Fields/LexerMonad.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -94,7 +94,7 @@ toPWarnings =
9494
Just $ PWarning PWTLexTab (NE.head poss) $ "Tabs used as indentation at " ++ intercalate ", " (NE.toList $ fmap showPos poss)
9595
toWarning LexInconsistentIndentation poss =
9696
Just $ PWarning PWTInconsistentIndentation (NE.head poss) $ "Inconsistent indentation. Indentation jumps at lines " ++ intercalate ", " (NE.toList $ fmap (show . positionRow) poss)
97-
-- LexBraces warning about using { } delimeters is not reported as parser warning.
97+
-- LexBraces warning about using { } delimiters is not reported as parser warning.
9898
toWarning LexBraces _ =
9999
Nothing
100100

Cabal-syntax/src/Distribution/PackageDescription/Parsec.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -679,7 +679,7 @@ processImports v fromBuildInfo commonStanzas = go []
679679
fields' <- catMaybes <$> traverse (warnImport v) fields
680680
pure $ (fields', \x -> foldr (mergeCommonStanza fromBuildInfo) x acc)
681681

682-
-- | Warn on "import" fields, also map to Maybe, so errorneous fields can be filtered
682+
-- | Warn on "import" fields, also map to Maybe, so erroneous fields can be filtered
683683
warnImport :: CabalSpecVersion -> Field Position -> ParseResult (Maybe (Field Position))
684684
warnImport v (Field (Name pos name) _) | name == "import" = do
685685
if specHasCommonStanzas v == NoCommonStanzas

Cabal-syntax/src/Distribution/SPDX/LicenseId.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -677,7 +677,7 @@ data LicenseId
677677
deriving (Eq, Ord, Enum, Bounded, Show, Read, Typeable, Data)
678678

679679
instance Binary LicenseId where
680-
-- Word16 is encoded in big endianess
680+
-- Word16 is encoded in big endianness
681681
-- https://github.com/kolmodin/binary/blob/master/src/Data/Binary/Class.hs#L220-LL227
682682
put = Binary.putWord16be . fromIntegral . fromEnum
683683
get = do

Cabal-syntax/src/Distribution/Types/VersionInterval.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -95,7 +95,7 @@ isVersion0 = (==) version0
9595
stage1 :: VersionRange -> [VersionInterval]
9696
stage1 = cataVersionRange alg
9797
where
98-
-- version range leafs transform into singleton intervals
98+
-- version range leaves transform into singleton intervals
9999
alg (ThisVersionF v) = [VersionInterval (LowerBound v InclusiveBound) (UpperBound v InclusiveBound)]
100100
alg (LaterVersionF v) = [VersionInterval (LowerBound v ExclusiveBound) NoUpperBound]
101101
alg (OrLaterVersionF v) = [VersionInterval (LowerBound v InclusiveBound) NoUpperBound]

Cabal-tests/tests/ParserTests.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -140,7 +140,7 @@ errorTest fp = cabalGoldenTest fp correct $ do
140140

141141
return $ toUTF8BS $ case x of
142142
Right gpd ->
143-
"UNXPECTED SUCCESS\n" ++
143+
"UNEXPECTED SUCCESS\n" ++
144144
showGenericPackageDescription gpd
145145
Left (v, errs) ->
146146
unlines $ ("VERSION: " ++ show v) : map (showPError fp) (NE.toList errs)

Cabal-tests/tests/UnitTests/Distribution/SPDX.hs

Lines changed: 1 addition & 1 deletion
Original file line numberDiff line numberDiff line change
@@ -91,7 +91,7 @@ shouldReject = map License
9191
--
9292
-- * "WITH exc" exceptions are rejected
9393
--
94-
-- * There should be a way to interpert license as (conjunction of)
94+
-- * There should be a way to interpret license as (conjunction of)
9595
-- OSI-accepted licenses or CC0
9696
--
9797
isAcceptableLicense :: License -> Bool

Cabal/src/Distribution/GetOpt.hs

Lines changed: 4 additions & 4 deletions
Original file line numberDiff line numberDiff line change
@@ -134,11 +134,11 @@ zipDefault ad bd (a : as) (b : bs) = (a, b) : zipDefault ad bd as bs
134134
-- | Pretty printing of short options.
135135
-- * With required arguments can be given as:
136136
-- @-w PATH or -wPATH (but not -w=PATH)@
137-
-- This is dislayed as:
137+
-- This is displayed as:
138138
-- @-w PATH or -wPATH@
139139
-- * With optional but default arguments can be given as:
140140
-- @-j or -jNUM (but not -j=NUM or -j NUM)@
141-
-- This is dislayed as:
141+
-- This is displayed as:
142142
-- @-j[NUM]@
143143
fmtShort :: ArgDescr a -> Char -> String
144144
fmtShort (NoArg _) so = "-" ++ [so]
@@ -152,11 +152,11 @@ fmtShort (OptArg _ _ ad) so =
152152
-- | Pretty printing of long options.
153153
-- * With required arguments can be given as:
154154
-- @--with-compiler=PATH (but not --with-compiler PATH)@
155-
-- This is dislayed as:
155+
-- This is displayed as:
156156
-- @--with-compiler=PATH@
157157
-- * With optional but default arguments can be given as:
158158
-- @--jobs or --jobs=NUM (but not --jobs NUM)@
159-
-- This is dislayed as:
159+
-- This is displayed as:
160160
-- @--jobs[=NUM]@
161161
fmtLong :: ArgDescr a -> String -> String
162162
fmtLong (NoArg _) lo = "--" ++ lo

Cabal/src/Distribution/PackageDescription/Check/Common.hs

Lines changed: 3 additions & 3 deletions
Original file line numberDiff line numberDiff line change
@@ -79,7 +79,7 @@ partitionDeps ads ns ds = do
7979
-- shared targets that match
8080
fads = filter (flip elem dqs . fst) ads
8181
-- the names of such targets
82-
inNam = nub $ map fst fads :: [UnqualComponentName]
82+
inName = nub $ map fst fads :: [UnqualComponentName]
8383
-- the dependencies of such targets
8484
inDep = concatMap snd fads :: [Dependency]
8585

@@ -96,7 +96,7 @@ partitionDeps ads ns ds = do
9696
-- text, ← no warning, inherited
9797
-- monadacme ← warning!
9898
let fFun d =
99-
notElem (unqualName d) inNam
99+
notElem (unqualName d) inName
100100
&& notElem
101101
(unqualName d)
102102
(map unqualName inDep)
@@ -116,7 +116,7 @@ partitionDeps ads ns ds = do
116116
-- for important dependencies like base).
117117
checkPVP
118118
:: Monad m
119-
=> (String -> PackageCheck) -- Warn message dependend on name
119+
=> (String -> PackageCheck) -- Warn message depends on name
120120
-- (e.g. "base", "Cabal").
121121
-> [Dependency]
122122
-> CheckM m ()

0 commit comments

Comments
 (0)