From 9938fd545e203b832f703761fe4f65613d5ccdba Mon Sep 17 00:00:00 2001
From: deltaspace0 <rgadeew@yandex.ru>
Date: Sat, 5 Nov 2022 18:48:43 +0300
Subject: [PATCH] fix typos

---
 .../src/Distribution/PackageDescription/Quirks.hs      |  2 +-
 Cabal-syntax/src/Distribution/Types/Condition.hs       |  2 +-
 Cabal-syntax/src/Distribution/Types/Flag.hs            |  2 +-
 .../src/Distribution/Types/LibraryVisibility.hs        |  2 +-
 .../src/Distribution/Types/PkgconfigVersion.hs         |  2 +-
 Cabal-syntax/src/Distribution/Utils/ShortText.hs       |  2 +-
 Cabal-syntax/src/Distribution/Utils/Structured.hs      |  2 +-
 Cabal/src/Distribution/Simple/Command.hs               |  2 +-
 Cabal/src/Distribution/Simple/Configure.hs             |  2 +-
 Cabal/src/Distribution/Types/LocalBuildInfo.hs         |  2 +-
 cabal-install/changelog                                | 10 +++++-----
 cabal-install/src/Distribution/Client/FetchUtils.hs    |  4 ++--
 cabal-install/src/Distribution/Client/ProjectConfig.hs |  2 +-
 cabal-install/src/Distribution/Client/Setup.hs         |  2 +-
 cabal-install/src/Distribution/Client/VCS.hs           |  4 ++--
 .../UnitTests/Distribution/Client/Init/Interactive.hs  |  2 +-
 .../tests/UnitTests/Distribution/Client/Init/Utils.hs  |  2 +-
 .../tests/UnitTests/Distribution/Client/VCS.hs         |  2 +-
 changelog.d/pr-8499                                    |  2 +-
 doc/cabal-commands.rst                                 |  4 ++--
 doc/cabal-project.rst                                  |  2 +-
 doc/setup-commands.rst                                 |  2 +-
 release-notes/Cabal-3.4.0.0.md                         |  4 ++--
 release-notes/Cabal-3.6.1.0.md                         |  6 +++---
 release-notes/Cabal-3.8.0.20220526.md                  |  4 ++--
 release-notes/Cabal-3.8.1.0.md                         |  2 +-
 release-notes/cabal-install-3.4.0.0.md                 |  6 +++---
 release-notes/cabal-install-3.8.0.20220526.md          |  2 +-
 release-notes/cabal-install-3.8.1.0.md                 |  2 +-
 solver-benchmarks/HackageBenchmark.hs                  |  2 +-
 30 files changed, 43 insertions(+), 43 deletions(-)

diff --git a/Cabal-syntax/src/Distribution/PackageDescription/Quirks.hs b/Cabal-syntax/src/Distribution/PackageDescription/Quirks.hs
index a1103c7773..f2edfb3a38 100644
--- a/Cabal-syntax/src/Distribution/PackageDescription/Quirks.hs
+++ b/Cabal-syntax/src/Distribution/PackageDescription/Quirks.hs
@@ -37,7 +37,7 @@ patches = Map.fromList
     [ mk "-- This file has been generated from package.yaml by hpack version 0.17.0.\n--\n-- see: https://github.com/sol/hpack\n\nname:                unicode-transforms\nversion:             0.3.3\nsynopsis:            Unicode normalization\ndescription:         Fast Unic"
          (Fingerprint 15958160436627155571 10318709190730872881)
          (Fingerprint 11008465475756725834 13815629925116264363)
-         (bsRemove "  other-modules:\n      .\n") -- TODO: remove traling \n to test structural-diff
+         (bsRemove "  other-modules:\n      .\n") -- TODO: remove trailing \n to test structural-diff
     -- http://hackage.haskell.org/package/DSTM-0.1.2
     -- http://hackage.haskell.org/package/DSTM-0.1.1
     -- http://hackage.haskell.org/package/DSTM-0.1
diff --git a/Cabal-syntax/src/Distribution/Types/Condition.hs b/Cabal-syntax/src/Distribution/Types/Condition.hs
index 8a36bd487a..0c89cb910d 100644
--- a/Cabal-syntax/src/Distribution/Types/Condition.hs
+++ b/Cabal-syntax/src/Distribution/Types/Condition.hs
@@ -26,7 +26,7 @@ cNot (Lit b)  = Lit (not b)
 cNot (CNot c) = c
 cNot c        = CNot c
 
--- | Boolean AND of two 'Condtion' values.
+-- | Boolean AND of two 'Condition' values.
 cAnd :: Condition a -> Condition a -> Condition a
 cAnd (Lit False) _           = Lit False
 cAnd _           (Lit False) = Lit False
diff --git a/Cabal-syntax/src/Distribution/Types/Flag.hs b/Cabal-syntax/src/Distribution/Types/Flag.hs
index d345321931..83cff4e063 100644
--- a/Cabal-syntax/src/Distribution/Types/Flag.hs
+++ b/Cabal-syntax/src/Distribution/Types/Flag.hs
@@ -193,7 +193,7 @@ lookupFlagAssignment fn = fmap snd . Map.lookup fn . getFlagAssignment
 
 -- | Insert or update the boolean value of a flag.
 --
--- If the flag is already present in the 'FlagAssigment', the
+-- If the flag is already present in the 'FlagAssignment', the
 -- value will be updated and the fact that multiple values have
 -- been provided for that flag will be recorded so that a
 -- warning can be generated later on.
diff --git a/Cabal-syntax/src/Distribution/Types/LibraryVisibility.hs b/Cabal-syntax/src/Distribution/Types/LibraryVisibility.hs
index 3e6e760002..c9cd9e01f0 100644
--- a/Cabal-syntax/src/Distribution/Types/LibraryVisibility.hs
+++ b/Cabal-syntax/src/Distribution/Types/LibraryVisibility.hs
@@ -20,7 +20,7 @@ import qualified Text.PrettyPrint                as Disp
 -- @since 3.0.0.0
 --
 data LibraryVisibility
-      -- | Can be depenendent from other packages
+      -- | Can be dependent from other packages
     = LibraryVisibilityPublic
       -- | Internal library, default
     | LibraryVisibilityPrivate
diff --git a/Cabal-syntax/src/Distribution/Types/PkgconfigVersion.hs b/Cabal-syntax/src/Distribution/Types/PkgconfigVersion.hs
index fc042d773b..8779f328a6 100644
--- a/Cabal-syntax/src/Distribution/Types/PkgconfigVersion.hs
+++ b/Cabal-syntax/src/Distribution/Types/PkgconfigVersion.hs
@@ -53,7 +53,7 @@ instance Parsec PkgconfigVersion where
         predicate c = isAsciiAlphaNum c || c == '.' || c == '-'
 
 -------------------------------------------------------------------------------
--- rmpvercmp - pure Haskell implementation
+-- rpmvercmp - pure Haskell implementation
 -------------------------------------------------------------------------------
 
 -- | Compare two version strings as @pkg-config@ would compare them.
diff --git a/Cabal-syntax/src/Distribution/Utils/ShortText.hs b/Cabal-syntax/src/Distribution/Utils/ShortText.hs
index bcabdb4c1e..8279b4af6f 100644
--- a/Cabal-syntax/src/Distribution/Utils/ShortText.hs
+++ b/Cabal-syntax/src/Distribution/Utils/ShortText.hs
@@ -4,7 +4,7 @@
 
 -- | Compact representation of short 'Strings'
 --
--- This module is designed to be import qualifeid
+-- This module is designed to be import qualified
 --
 -- @
 -- import Distribution.Utils.ShortText (ShortText)
diff --git a/Cabal-syntax/src/Distribution/Utils/Structured.hs b/Cabal-syntax/src/Distribution/Utils/Structured.hs
index 16bc9561f4..5327ed6a42 100644
--- a/Cabal-syntax/src/Distribution/Utils/Structured.hs
+++ b/Cabal-syntax/src/Distribution/Utils/Structured.hs
@@ -321,7 +321,7 @@ containerStructure _ = Nominal faTypeRep 0 (show fTypeRep)
 -- Generic
 -------------------------------------------------------------------------------
 
--- | Derive 'structure' genrically.
+-- | Derive 'structure' generically.
 genericStructure :: forall a. (Typeable a, Generic a, GStructured (Rep a)) => Proxy a -> Structure
 genericStructure _ = gstructured (typeRep (Proxy :: Proxy a)) (Proxy :: Proxy (Rep a)) 0
 
diff --git a/Cabal/src/Distribution/Simple/Command.hs b/Cabal/src/Distribution/Simple/Command.hs
index 69e0a19765..5602e37968 100644
--- a/Cabal/src/Distribution/Simple/Command.hs
+++ b/Cabal/src/Distribution/Simple/Command.hs
@@ -574,7 +574,7 @@ helpCommandUI =
     commandNotes = Just $ \pname ->
        "Examples:\n"
     ++ "  " ++ pname ++ " help help\n"
-    ++ "    Oh, appararently you already know this.\n"
+    ++ "    Oh, apparently you already know this.\n"
   }
 
 -- | wraps a @CommandUI@ together with a function that turns it into a @Command@.
diff --git a/Cabal/src/Distribution/Simple/Configure.hs b/Cabal/src/Distribution/Simple/Configure.hs
index e9fc314bf9..d8d2aecb80 100644
--- a/Cabal/src/Distribution/Simple/Configure.hs
+++ b/Cabal/src/Distribution/Simple/Configure.hs
@@ -2067,7 +2067,7 @@ checkForeignLibSupported comp platform flib = go (compilerFlavor comp)
     go :: CompilerFlavor -> Maybe String
     go GHC
       | compilerVersion comp < mkVersion [7,8] = unsupported [
-        "Building foreign libraires is only supported with GHC >= 7.8"
+        "Building foreign libraries is only supported with GHC >= 7.8"
       ]
       | otherwise = goGhcPlatform platform
     go _   = unsupported [
diff --git a/Cabal/src/Distribution/Types/LocalBuildInfo.hs b/Cabal/src/Distribution/Types/LocalBuildInfo.hs
index bef0744444..bc9f6bc45d 100644
--- a/Cabal/src/Distribution/Types/LocalBuildInfo.hs
+++ b/Cabal/src/Distribution/Types/LocalBuildInfo.hs
@@ -283,7 +283,7 @@ testCoverage lbi = exeCoverage lbi && libCoverage lbi
 -------------------------------------------------------------------------------
 -- Stub functions to prevent someone from accidentally defining them
 
-{-# WARNING componentNameTargets, unitIdTarget, allTargetsInBuildOrder, withAllTargetsInBuildOrder, neededTargetsInBuildOrder, withNeededTargetsInBuildOrder "By using this function, you may be introducing a bug where you retrieve a 'Component' which does not have 'HookedBuildInfo' applied to it.  See the documentation for 'HookedBuildInfo' for an explanation of the issue.  If you have a 'PakcageDescription' handy (NOT from the 'LocalBuildInfo'), try using the primed version of the function, which takes it as an extra argument." #-}
+{-# WARNING componentNameTargets, unitIdTarget, allTargetsInBuildOrder, withAllTargetsInBuildOrder, neededTargetsInBuildOrder, withNeededTargetsInBuildOrder "By using this function, you may be introducing a bug where you retrieve a 'Component' which does not have 'HookedBuildInfo' applied to it.  See the documentation for 'HookedBuildInfo' for an explanation of the issue.  If you have a 'PackageDescription' handy (NOT from the 'LocalBuildInfo'), try using the primed version of the function, which takes it as an extra argument." #-}
 
 componentNameTargets :: LocalBuildInfo -> ComponentName -> [TargetInfo]
 componentNameTargets lbi = componentNameTargets' (localPkgDescr lbi) lbi
diff --git a/cabal-install/changelog b/cabal-install/changelog
index 48be043315..dc75160a18 100644
--- a/cabal-install/changelog
+++ b/cabal-install/changelog
@@ -169,7 +169,7 @@
 	* Default changelog generated by 'cabal init' is now named
 	  'CHANGELOG.md' (#5441).
 	* Align output of 'new-build' command phases (#4040).
-	* Add suport for specifying remote VCS dependencies via new
+	* Add support for specifying remote VCS dependencies via new
 	  'source-repository-package' stanzas in 'cabal.project' files
 	  (#5351).
 
@@ -206,7 +206,7 @@
 	* Use [lfxtb] letters to differentiate component kind instead of
 	opaque "c" in dist-dir layout.
 	* 'cabal configure' now supports '--enable-static', which can be
-	used to build static libaries with GHC via GHC's `-staticlib`
+	used to build static libraries with GHC via GHC's `-staticlib`
 	flag.
 	* 'cabal user-config now supports '--augment' which can append
 	additional lines to a new or updated cabal config file.
@@ -226,7 +226,7 @@
 	when it wasn't necessary (#4444).
 	* Packages installed in sandboxes via 'add-source' now have
 	their timestamps updated correctly and so will not be reinstalled
-	unncecessarily if the main install command fails (#1375).
+	unnecessarily if the main install command fails (#1375).
 	* Add Windows device path support for copyFile, renameFile. Allows cabal
 	new-build to use temporary store path of up to 32k length
 	(#3972, #4914, #4515).
@@ -577,9 +577,9 @@
 	* Improved bootstrap.sh
 
 0.5.2 Duncan Coutts <duncan@haskell.org> Aug 2008
-	* Suport building haddock documentaion
+	* Support building haddock documentation
 	* Self-reinstall now works on Windows
-	* Allow adding symlinks to excutables into a separate bindir
+	* Allow adding symlinks to executables into a separate bindir
 	* New self-documenting config file
 	* New install --reinstall flag
 	* More helpful status messages in a couple places
diff --git a/cabal-install/src/Distribution/Client/FetchUtils.hs b/cabal-install/src/Distribution/Client/FetchUtils.hs
index a4f5a95f79..67dde41db2 100644
--- a/cabal-install/src/Distribution/Client/FetchUtils.hs
+++ b/cabal-install/src/Distribution/Client/FetchUtils.hs
@@ -290,7 +290,7 @@ waitAsyncFetchPackage verbosity downloadMap srcloc =
 -- ------------------------------------------------------------
 
 -- | Generate the full path to the locally cached copy of
--- the tarball for a given @PackageIdentifer@.
+-- the tarball for a given @PackageIdentifier@.
 --
 packageFile :: Repo -> PackageId -> FilePath
 packageFile repo pkgid = packageDir repo pkgid
@@ -298,7 +298,7 @@ packageFile repo pkgid = packageDir repo pkgid
                      <.> "tar.gz"
 
 -- | Generate the full path to the directory where the local cached copy of
--- the tarball for a given @PackageIdentifer@ is stored.
+-- the tarball for a given @PackageIdentifier@ is stored.
 --
 packageDir :: Repo -> PackageId -> FilePath
 packageDir (RepoLocalNoIndex (LocalRepo _ dir _) _) _pkgid = dir
diff --git a/cabal-install/src/Distribution/Client/ProjectConfig.hs b/cabal-install/src/Distribution/Client/ProjectConfig.hs
index 645ebe6f62..83184d5902 100644
--- a/cabal-install/src/Distribution/Client/ProjectConfig.hs
+++ b/cabal-install/src/Distribution/Client/ProjectConfig.hs
@@ -467,7 +467,7 @@ withProjectOrGlobalConfig
     -> Flag Bool                  -- ^ whether to ignore local project (--ignore-project flag)
     -> Flag FilePath              -- ^ @--cabal-config@
     -> IO a                       -- ^ with project
-    -> (ProjectConfig -> IO a)    -- ^ without projet
+    -> (ProjectConfig -> IO a)    -- ^ without project
     -> IO a
 withProjectOrGlobalConfig verbosity (Flag True) gcf _with without = do
     globalConfig <- runRebuild "" $ readGlobalConfig verbosity gcf
diff --git a/cabal-install/src/Distribution/Client/Setup.hs b/cabal-install/src/Distribution/Client/Setup.hs
index b4653f977b..8fd0788e1a 100644
--- a/cabal-install/src/Distribution/Client/Setup.hs
+++ b/cabal-install/src/Distribution/Client/Setup.hs
@@ -505,7 +505,7 @@ filterConfigureFlags flags cabalLibVersion
     flags_2_5_0 = flags_3_7_0 {
       -- Cabal < 2.5 does not understand --dependency=pkg:component=cid
       -- (public sublibraries), so we convert it to the legacy
-      -- --dependency=pkg_or_internal_compoent=cid
+      -- --dependency=pkg_or_internal_component=cid
         configDependencies =
           let convertToLegacyInternalDep (GivenComponent _ (LSubLibName cn) cid) =
                 Just $ GivenComponent
diff --git a/cabal-install/src/Distribution/Client/VCS.hs b/cabal-install/src/Distribution/Client/VCS.hs
index d6037f21b0..8b0a95462d 100644
--- a/cabal-install/src/Distribution/Client/VCS.hs
+++ b/cabal-install/src/Distribution/Client/VCS.hs
@@ -205,7 +205,7 @@ cloneSourceRepo verbosity vcs
                                srcuri destdir
 
 
--- | Syncronise a set of 'SourceRepo's referring to the same repository with
+-- | Synchronise a set of 'SourceRepo's referring to the same repository with
 -- corresponding local directories. The local directories may or may not
 -- already exist.
 --
@@ -654,7 +654,7 @@ svnProgram = (simpleProgram "svn") {
 --
 --
 --                    ----->  foo on branch B ----->
---    resolve confict                                  Initial patch
+--    resolve conflict                                  Initial patch
 --                    ----->  foo on branch A ----->
 --
 --    Which is seems reasonable.
diff --git a/cabal-install/tests/UnitTests/Distribution/Client/Init/Interactive.hs b/cabal-install/tests/UnitTests/Distribution/Client/Init/Interactive.hs
index 8fb63045e8..4a2d000cb4 100644
--- a/cabal-install/tests/UnitTests/Distribution/Client/Init/Interactive.hs
+++ b/cabal-install/tests/UnitTests/Distribution/Client/Init/Interactive.hs
@@ -937,7 +937,7 @@ interactiveTests srcDb = testGroup "Check top level getter functions"
             ]
         ]
     , testGroup "Check srcDirsPrompt output"
-        [ testNumberedPrompt "Soruce dirs indices" srcDirsPrompt
+        [ testNumberedPrompt "Source dirs indices" srcDirsPrompt
             [[defaultSourceDir], ["lib"], ["src-lib"]]
         , testSimplePrompt "Other source dir"
             srcDirsPrompt ["src"]
diff --git a/cabal-install/tests/UnitTests/Distribution/Client/Init/Utils.hs b/cabal-install/tests/UnitTests/Distribution/Client/Init/Utils.hs
index e65bb15ab9..0729e50776 100644
--- a/cabal-install/tests/UnitTests/Distribution/Client/Init/Utils.hs
+++ b/cabal-install/tests/UnitTests/Distribution/Client/Init/Utils.hs
@@ -51,7 +51,7 @@ dummyFlags = emptyFlags
 emptyFlags :: InitFlags
 emptyFlags = mempty
 
--- | Retireves the proper base version based on the GHC version
+-- | Retrieves the proper base version based on the GHC version
 baseVersion :: Compiler -> VersionRange
 baseVersion Compiler {compilerId = CompilerId GHC ver} =
   let ghcToBase = baseVersion' . prettyShow $ ver in
diff --git a/cabal-install/tests/UnitTests/Distribution/Client/VCS.hs b/cabal-install/tests/UnitTests/Distribution/Client/VCS.hs
index 84bf78983d..b361bdd8ff 100644
--- a/cabal-install/tests/UnitTests/Distribution/Client/VCS.hs
+++ b/cabal-install/tests/UnitTests/Distribution/Client/VCS.hs
@@ -301,7 +301,7 @@ prop_syncRepos vcs mkVCSTestDriver
 --
 -- So, given a source repo dir, the corresponding 'RepoState' and a number of
 -- target repo dirs, pick a sequence of (lists of) sync targets from the
--- 'RepoState' and syncronise the target dirs with those targets, checking for
+-- 'RepoState' and synchronise the target dirs with those targets, checking for
 -- each one that the actual working state matches the expected repo state.
 --
 checkSyncRepos
diff --git a/changelog.d/pr-8499 b/changelog.d/pr-8499
index f825339e31..f909fbf18f 100644
--- a/changelog.d/pr-8499
+++ b/changelog.d/pr-8499
@@ -3,5 +3,5 @@ packages: Cabal
 prs: #8499
 issues: #8458
 description: {
-    Ensure thatt extra-src-dirs, extra sources, and extra other modules all are added using ordNub rather than incidentally alphabetized.
+    Ensure that extra-src-dirs, extra sources, and extra other modules all are added using ordNub rather than incidentally alphabetized.
 }
diff --git a/doc/cabal-commands.rst b/doc/cabal-commands.rst
index 2773eae821..0ea968b0f5 100644
--- a/doc/cabal-commands.rst
+++ b/doc/cabal-commands.rst
@@ -511,9 +511,9 @@ description file or freeze file.
 
     :since: 2.4
 
-    Read dependendency version bounds from the v2-style freeze file
+    Read dependency version bounds from the v2-style freeze file
     related to the named project file (i.e., ``$PROJECTFILE.freeze``)
-    instead of the package desctription file. If multiple ``--project-file``
+    instead of the package description file. If multiple ``--project-file``
     flags are provided, only the final one is considered. This flag
     must only be passed in when ``--new-freeze-file`` is present.
 
diff --git a/doc/cabal-project.rst b/doc/cabal-project.rst
index 863ad1bf3c..d12c08475c 100644
--- a/doc/cabal-project.rst
+++ b/doc/cabal-project.rst
@@ -913,7 +913,7 @@ Object code options
 
     :default: False
 
-    If the compiler (e.g., GHC 7.10 and later) supports outputing OS
+    If the compiler (e.g., GHC 7.10 and later) supports outputting OS
     native debug info (e.g., DWARF), setting ``debug-info: True`` will
     instruct it to do so. See the GHC wiki page on :ghc-wiki:`DWARF`
     for more information about this feature.
diff --git a/doc/setup-commands.rst b/doc/setup-commands.rst
index fd1c08e2a2..12af7db7fd 100644
--- a/doc/setup-commands.rst
+++ b/doc/setup-commands.rst
@@ -790,7 +790,7 @@ Miscellaneous options
 
    Build a static library. This passes ``-staticlib`` to GHC (available
    for iOS, and with 8.4 more platforms).  The result is an archive ``.a``
-   containing all dependent haskell libararies combined.
+   containing all dependent haskell libraries combined.
 
 .. option:: --disable-static
 
diff --git a/release-notes/Cabal-3.4.0.0.md b/release-notes/Cabal-3.4.0.0.md
index d17a56d815..bc337de340 100644
--- a/release-notes/Cabal-3.4.0.0.md
+++ b/release-notes/Cabal-3.4.0.0.md
@@ -9,7 +9,7 @@
   - Support for `-this-package-key` deprecation
   - Use process `createPipe`
   - Add support for WINIO to Cabal
-  - Adopt to simplfied subsumption changes
+  - Adopt to simplified subsumption changes
 
   There are no magical `IO = WithCallStack Prelude.IO` alias in Cabal,
   as it is hard to get working with GHC-9.0's simplified subsumption.
@@ -131,7 +131,7 @@
 - default-language field is optional in cabal-version: 3.4 [#6288](https://github.com/haskell/cabal/issues/6288) [!6924](https://github.com/haskell/cabal/pull/6924) [!6926](https://github.com/haskell/cabal/pull/6926)
 - Split `KnownRepoType` out of `RepoType` [#6432](https://github.com/haskell/cabal/issues/6432) [!6612](https://github.com/haskell/cabal/pull/6612)
 - Include component name in unit-id [#6485](https://github.com/haskell/cabal/issues/6485) [!6547](https://github.com/haskell/cabal/pull/6547)
-- Change 'optional-packages' default to empty, when cabal.project is mising. [#4797](https://github.com/haskell/cabal/issues/4797) [#6739](https://github.com/haskell/cabal/issues/6739) [!6740](https://github.com/haskell/cabal/pull/6740)
+- Change 'optional-packages' default to empty, when cabal.project is missing. [#4797](https://github.com/haskell/cabal/issues/4797) [#6739](https://github.com/haskell/cabal/issues/6739) [!6740](https://github.com/haskell/cabal/pull/6740)
 - Fix rpmvercmp (trailing non-digit characters) [#6805](https://github.com/haskell/cabal/issues/6805) [!6808](https://github.com/haskell/cabal/pull/6808)
 - other changes [!6556](https://github.com/haskell/cabal/pull/6556) [!6598](https://github.com/haskell/cabal/pull/6598) [!6910](https://github.com/haskell/cabal/pull/6910)
 - Package description parser benchmark [!6594](https://github.com/haskell/cabal/pull/6594)
diff --git a/release-notes/Cabal-3.6.1.0.md b/release-notes/Cabal-3.6.1.0.md
index cf207ae902..4336060a76 100644
--- a/release-notes/Cabal-3.6.1.0.md
+++ b/release-notes/Cabal-3.6.1.0.md
@@ -33,15 +33,15 @@ Cabal 3.6.1.0 Changelog
   As such, this patch provides a workaround for
   older, already existing GHC versions by first always
   following the symbolic link of the ghc binary (if it is one)
-  and prefering its target directory as the guess lookup
+  and preferring its target directory as the guess lookup
   location.
 
   Rationale
 
   The canonicalized path of the ghc binary usually points to the
   bin/ directory unpacked from a bindist, which is less likely to be
-  tampered with by distributions and tools. As such, prefering the
-  canoncialized path should get us more robust results.
+  tampered with by distributions and tools. As such, preferring the
+  canonicalized path should get us more robust results.
 
 - Fix `cabal test --enable-library-coverage` for other-modules [#5213](https://github.com/haskell/cabal/issues/5213) [#7493](https://github.com/haskell/cabal/pull/7493)
 
diff --git a/release-notes/Cabal-3.8.0.20220526.md b/release-notes/Cabal-3.8.0.20220526.md
index 40fddd2e0b..42e58aec85 100644
--- a/release-notes/Cabal-3.8.0.20220526.md
+++ b/release-notes/Cabal-3.8.0.20220526.md
@@ -105,7 +105,7 @@ Cabal 3.8.0.20220526 Changelog
 
   - Make builds that use experimental Cabal language features less noisy. At -v1
     (normal) we show just first instance of use of experimental cabal language
-  features, along with count of further occurences in the same file.
+  features, along with count of further occurrences in the same file.
 
 - Fix Cabal not finding public sublibraries of installed packages [#7270](https://github.com/haskell/cabal/issues/7270) [#8089](https://github.com/haskell/cabal/pull/8089)
 
@@ -135,7 +135,7 @@ Cabal 3.8.0.20220526 Changelog
 - Add "prompt" strategy when symlinking binaries. [#5672](https://github.com/haskell/cabal/pull/5672)
 - Add fields extra-libraries-static and extra-lib-dirs-static [#6688](https://github.com/haskell/cabal/issues/6688) [#7399](https://github.com/haskell/cabal/issues/7399) [#7536](https://github.com/haskell/cabal/pull/7536)
 - Paths passed to GHC are now relative to the current working directory
-- Autoatically pipe auth from repo uris into curl transport. [#4743](https://github.com/haskell/cabal/issues/4743) [#7630](https://github.com/haskell/cabal/pull/7630)
+- Automatically pipe auth from repo uris into curl transport. [#4743](https://github.com/haskell/cabal/issues/4743) [#7630](https://github.com/haskell/cabal/pull/7630)
 - raise lower bound of process and remove compatibility shims [#7922](https://github.com/haskell/cabal/pull/7922)
 - changes the cabal check warning about long synopsis, so it warns only synopsis bigger than the set size [#7932](https://github.com/haskell/cabal/issues/7932) [#7933](https://github.com/haskell/cabal/pull/7933)
 - Remove bootstrapping plan files from version control, and simplify bootstrap update Makefile targets. [#7949](https://github.com/haskell/cabal/pull/7949)
diff --git a/release-notes/Cabal-3.8.1.0.md b/release-notes/Cabal-3.8.1.0.md
index 63ed935af3..44e0f2aac6 100644
--- a/release-notes/Cabal-3.8.1.0.md
+++ b/release-notes/Cabal-3.8.1.0.md
@@ -78,7 +78,7 @@ Cabal 3.8.1.0 Changelog
 
   - Make builds that use experimental Cabal language features less noisy. At -v1
     (normal) we show just first instance of use of experimental cabal language
-  features, along with count of further occurences in the same file.
+  features, along with count of further occurrences in the same file.
 
 - Fix Cabal not finding public sublibraries of installed packages [#7270](https://github.com/haskell/cabal/issues/7270) [#8089](https://github.com/haskell/cabal/pull/8089)
 
diff --git a/release-notes/cabal-install-3.4.0.0.md b/release-notes/cabal-install-3.4.0.0.md
index 88d0080a71..d91143a441 100644
--- a/release-notes/cabal-install-3.4.0.0.md
+++ b/release-notes/cabal-install-3.4.0.0.md
@@ -9,7 +9,7 @@
   - Support for `-this-package-key` deprecation
   - Use process `createPipe`
   - Add support for WINIO to Cabal
-  - Adopt to simplfied subsumption changes
+  - Adopt to simplified subsumption changes
 
   There are no magical `IO = WithCallStack Prelude.IO` alias in Cabal,
   as it is hard to get working with GHC-8.12's simplified subsumption.
@@ -28,7 +28,7 @@
   build-depends: thispkg:somesublib
   ```
 
-  This fixes an issue, where it was impossible to refer to extenral
+  This fixes an issue, where it was impossible to refer to external
   library, if you had sublibrary of the same name.
 
 - Add active-repositories configuration [#6819](https://github.com/haskell/cabal/issues/6819) [!6724](https://github.com/haskell/cabal/pull/6724) [!6868](https://github.com/haskell/cabal/pull/6868)
@@ -218,7 +218,7 @@
 - Include component name in unit-id [#6485](https://github.com/haskell/cabal/issues/6485) [!6547](https://github.com/haskell/cabal/pull/6547)
 - cabal v2-install prints copy/symlink destination [#6575](https://github.com/haskell/cabal/issues/6575) [!6582](https://github.com/haskell/cabal/pull/6582) [!6890](https://github.com/haskell/cabal/pull/6890)
 - Prepend hs-source-dir to match-component, fixes `cabal repl file` [#6622](https://github.com/haskell/cabal/issues/6622) [!6623](https://github.com/haskell/cabal/pull/6623) [!6826](https://github.com/haskell/cabal/pull/6826) [!6875](https://github.com/haskell/cabal/pull/6875)
-- Change 'optional-packages' default to empty, when cabal.project is mising. [#4797](https://github.com/haskell/cabal/issues/4797) [#6739](https://github.com/haskell/cabal/issues/6739) [!6740](https://github.com/haskell/cabal/pull/6740)
+- Change 'optional-packages' default to empty, when cabal.project is missing. [#4797](https://github.com/haskell/cabal/issues/4797) [#6739](https://github.com/haskell/cabal/issues/6739) [!6740](https://github.com/haskell/cabal/pull/6740)
 - v2-update reports new index-state [#6804](https://github.com/haskell/cabal/issues/6804) [!6810](https://github.com/haskell/cabal/pull/6810)
 - Fix rpmvercmp (trailing non-digit characters) [#6805](https://github.com/haskell/cabal/issues/6805) [!6808](https://github.com/haskell/cabal/pull/6808)
 - Add `-z` / `--ignore-project` flag to `cabal v2-update` [#6809](https://github.com/haskell/cabal/issues/6809) [!6814](https://github.com/haskell/cabal/pull/6814)
diff --git a/release-notes/cabal-install-3.8.0.20220526.md b/release-notes/cabal-install-3.8.0.20220526.md
index 674847423e..aae97c1857 100644
--- a/release-notes/cabal-install-3.8.0.20220526.md
+++ b/release-notes/cabal-install-3.8.0.20220526.md
@@ -201,7 +201,7 @@ cabal-install 3.8.0.20220526 Changelog
 
 - Fix running GHCJS executables [#6175](https://github.com/haskell/cabal/issues/6175) [#6361](https://github.com/haskell/cabal/issues/6361) [#7575](https://github.com/haskell/cabal/pull/7575)
 
-- Support Git submodules in `source-package-respository` [#5536](https://github.com/haskell/cabal/issues/5536) [#7625](https://github.com/haskell/cabal/pull/7625)
+- Support Git submodules in `source-package-repository` [#5536](https://github.com/haskell/cabal/issues/5536) [#7625](https://github.com/haskell/cabal/pull/7625)
 
 - Add support for `--package-db` flags to v2 commands [#5773](https://github.com/haskell/cabal/issues/5773) [#7676](https://github.com/haskell/cabal/pull/7676)
 
diff --git a/release-notes/cabal-install-3.8.1.0.md b/release-notes/cabal-install-3.8.1.0.md
index ebddac2d64..95565d936c 100644
--- a/release-notes/cabal-install-3.8.1.0.md
+++ b/release-notes/cabal-install-3.8.1.0.md
@@ -195,7 +195,7 @@ cabal-install 3.8.1.0 Changelog
 
 - Fix running GHCJS executables [#6175](https://github.com/haskell/cabal/issues/6175) [#6361](https://github.com/haskell/cabal/issues/6361) [#7575](https://github.com/haskell/cabal/pull/7575)
 
-- Support Git submodules in `source-package-respository` [#5536](https://github.com/haskell/cabal/issues/5536) [#7625](https://github.com/haskell/cabal/pull/7625)
+- Support Git submodules in `source-package-repository` [#5536](https://github.com/haskell/cabal/issues/5536) [#7625](https://github.com/haskell/cabal/pull/7625)
 
 - Add support for `--package-db` flags to v2 commands [#5773](https://github.com/haskell/cabal/issues/5773) [#7676](https://github.com/haskell/cabal/pull/7676)
 
diff --git a/solver-benchmarks/HackageBenchmark.hs b/solver-benchmarks/HackageBenchmark.hs
index 75f471f42f..d650f38e56 100644
--- a/solver-benchmarks/HackageBenchmark.hs
+++ b/solver-benchmarks/HackageBenchmark.hs
@@ -213,7 +213,7 @@ runCabal timeoutSeconds cabalUnderTest cabal flags = do
   putStrLn $ "Cabal directory (for " ++ cabal ++ ") " ++ cabalDir
   createDirectoryIfMissing True cabalDir
 
-  -- shell enviroment
+  -- shell environment
   currEnv <- Map.fromList <$>  getEnvironment
   let thisEnv :: [(String, String)]
       thisEnv = Map.toList $ currEnv
-- 
GitLab