Skip to content
Snippets Groups Projects
Unverified Commit e386a13c authored by Phil de Joux's avatar Phil de Joux
Browse files

Add missing line at EOF for cabal-testsuite/**/*.hs

- Fix whitespace in cabal-testsuite + other tests
parent e420bf25
No related branches found
No related tags found
No related merge requests found
Showing
with 19 additions and 21 deletions
......@@ -53,12 +53,12 @@ tests = testGroup "Distribution.Simple.Program.GHC"
, compilerCompat = []
, compilerLanguages = []
, compilerExtensions = []
, compilerProperties = Map.singleton "Support parallel --make" "YES"
, compilerProperties = Map.singleton "Support parallel --make" "YES"
})
(Platform X86_64 Linux)
(mempty { ghcOptNumJobs = Flag (NumJobs (Just 4)) })
assertListEquals flags ["-j4", "-clear-package-db"]
]
]
]
assertListEquals :: (Eq a, Show a) => [a] -> [a] -> Assertion
......
config/default-config
\ No newline at end of file
config/default-config
......@@ -4,7 +4,7 @@ main = setupTest $ do
skipUnlessGhcVersion ">= 8.1"
ghc <- isGhcVersion "== 9.0.2 || == 9.2.* || == 9.4.* || == 9.6.*"
expectBrokenIf ghc 7987 $
withPackageDb $
withPackageDb $
withDirectory "Includes2" $ do
let setup_install' args = setup_install_with_docs args
setup_install' ["mylib", "--cid", "mylib-0.1.0.0"]
......
......@@ -20,4 +20,3 @@ executable demo
else
cmm-options: -ddump-cmm
......@@ -11,4 +11,3 @@ main = setupTest $ do
res <- fails $ withDirectory "custom" $ setup' "aaaa" []
assertOutputContains "unrecognised command" res
......@@ -5,4 +5,4 @@ import qualified Distribution.Simple as DS
import Distribution.Simple.Setup
main :: IO ()
main = DS.defaultMainWithHooks DS.simpleUserHooks
main = DS.defaultMainWithHooks DS.simpleUserHooks
......@@ -9,4 +9,4 @@ import Test.Cabal.Prelude
-- TODO: Fix this behaviour and apply the patch cabal.dot-uv.patch to update the
-- expected output to what we'd expect if "cabal sdist" respected the project.
main = cabalTest . withProjectFile "cabal.dot-uv.project" $ do
cabal "sdist" ["all"]
\ No newline at end of file
cabal "sdist" ["all"]
......@@ -3,4 +3,4 @@ import Test.Cabal.Prelude
-- cabal.dot-uv.project has "packages: .". That package is uv.cabal and "cabal
-- v2-sdist" writes sdist/uv-0.1.tar.gz. This is correct.
main = cabalTest . withProjectFile "cabal.dot-uv.project" $ do
cabal "v2-sdist" ["all"]
\ No newline at end of file
cabal "v2-sdist" ["all"]
......@@ -2,4 +2,4 @@ import Test.Cabal.Prelude
-- This test correctly writes sdist/uv-0.1.tar.gz for the uv.cabal package.
main = cabalTest $ do
cabal "sdist" ["all", "--ignore-project"]
\ No newline at end of file
cabal "sdist" ["all", "--ignore-project"]
......@@ -5,4 +5,4 @@ import Test.Cabal.Prelude
-- and wrote sdist/p-0.1.tar.gz. That is incorrect. It didn't ignore the
-- project.
main = cabalTest $ do
cabal "v2-sdist" ["all", "--ignore-project"]
\ No newline at end of file
cabal "v2-sdist" ["all", "--ignore-project"]
......@@ -6,4 +6,4 @@ import Test.Cabal.Prelude
-- project probing would not occur and "cabal sdist" would work on the local
-- uv.cabal package.
main = cabalTest $ do
cabal "sdist" ["all"]
\ No newline at end of file
cabal "sdist" ["all"]
......@@ -6,4 +6,4 @@ import Test.Cabal.Prelude
-- seen) is that project probing would not occur and "cabal v2-sdist" would work
-- on the local uv.cabal package.
main = cabalTest $ do
cabal "v2-sdist" ["all"]
\ No newline at end of file
cabal "v2-sdist" ["all"]
......@@ -9,4 +9,4 @@ import Test.Cabal.Prelude
-- TODO: Fix this behaviour and apply the patch cabal.sub-pq.patch to update the
-- expected output to what we'd expect if "cabal sdist" respected the project.
main = cabalTest . withProjectFile "cabal.sub-pq.project" $ do
cabal "sdist" ["all"]
\ No newline at end of file
cabal "sdist" ["all"]
......@@ -3,4 +3,4 @@ import Test.Cabal.Prelude
-- cabal.sub-pq.project has "packages: p/ q/" and "cabal v2-sdist" writes
-- sdist/p-0.1.tar.gz and sdist/q-0.1.tar.gz. This is correct.
main = cabalTest . withProjectFile "cabal.sub-pq.project" $ do
cabal "v2-sdist" ["all"]
\ No newline at end of file
cabal "v2-sdist" ["all"]
......@@ -9,4 +9,4 @@ import Test.Cabal.Prelude
-- TODO: Fix this behaviour and apply the patch cabal.sub-rs.patch to update the
-- expected output to what we'd expect if "cabal sdist" respected the project.
main = cabalTest . withProjectFile "cabal.sub-rs.project" $ do
cabal "sdist" ["all"]
\ No newline at end of file
cabal "sdist" ["all"]
......@@ -3,4 +3,4 @@ import Test.Cabal.Prelude
-- cabal.sub-rs.project has "packages: r/ s/" and "cabal v2-sdist" writes
-- sdist/r-0.1.tar.gz and sdist/s-0.1.tar.gz. This is correct.
main = cabalTest . withProjectFile "cabal.sub-rs.project" $ do
cabal "v2-sdist" ["all"]
\ No newline at end of file
cabal "v2-sdist" ["all"]
......@@ -9,4 +9,4 @@ import Test.Cabal.Prelude
-- TODO: Fix this behaviour and apply the patch cabal.dot-uv.patch to update the
-- expected output to what we'd expect if "cabal sdist" respected the project.
main = cabalTest . withProjectFile "cabal.dot-uv.project" $ do
cabal "sdist" ["all"]
\ No newline at end of file
cabal "sdist" ["all"]
......@@ -3,4 +3,4 @@ import Test.Cabal.Prelude
-- cabal.dot-uv.project has "packages: .". That package is uv.cabal and "cabal
-- v2-sdist" writes sdist/p-0.1.tar.gz and sdist/q-0.1.tar.gz. That is correct.
main = cabalTest . withProjectFile "cabal.dot-uv.project" $ do
cabal "v2-sdist" ["all"]
\ No newline at end of file
cabal "v2-sdist" ["all"]
......@@ -2,4 +2,4 @@ import Test.Cabal.Prelude
-- This test correctly writes sdist/uv-0.1.tar.gz for the uv.cabal package.
main = cabalTest $ do
cabal "sdist" ["all", "--ignore-project"]
\ No newline at end of file
cabal "sdist" ["all", "--ignore-project"]
......@@ -4,4 +4,4 @@ import Test.Cabal.Prelude
-- sdist/uv-0.1.tar.gz for the uv.cabal package but instead it wrote
-- sdist/p-0.1.tar.gz and sdist/q-0.1.tar.gz.
main = cabalTest $ do
cabal "v2-sdist" ["all", "--ignore-project"]
\ No newline at end of file
cabal "v2-sdist" ["all", "--ignore-project"]
0% Loading or .
You are about to add 0 people to the discussion. Proceed with caution.
Finish editing this message first!
Please register or to comment