[commit: ghc] master: Replace shortcuts to issues by GitHub links (987240f)
git at git.haskell.org
git at git.haskell.org
Tue Oct 23 20:10:36 UTC 2018
Repository : ssh://git@git.haskell.org/ghc
On branch : master
Link : http://ghc.haskell.org/trac/ghc/changeset/987240f71ca0467617a0f067bf0e93ab836262b5/ghc
>---------------------------------------------------------------
commit 987240f71ca0467617a0f067bf0e93ab836262b5
Author: Andrey Mokhov <andrey.mokhov at gmail.com>
Date: Sun Oct 29 19:03:57 2017 +0000
Replace shortcuts to issues by GitHub links
See #440
>---------------------------------------------------------------
987240f71ca0467617a0f067bf0e93ab836262b5
src/Builder.hs | 6 +++---
src/Hadrian/Package.hs | 3 ++-
src/Rules/Install.hs | 16 +++++++++-------
src/Rules/SourceDist.hs | 4 +++-
src/Rules/Test.hs | 5 +++--
src/Settings/Packages/Base.hs | 3 ++-
src/Settings/Packages/Rts.hs | 6 +++---
7 files changed, 25 insertions(+), 18 deletions(-)
diff --git a/src/Builder.hs b/src/Builder.hs
index fdd73e7..8722609 100644
--- a/src/Builder.hs
+++ b/src/Builder.hs
@@ -208,9 +208,9 @@ instance H.Builder Builder where
_ -> cmd echo [path] buildArgs
-- TODO: Some builders are required only on certain platforms. For example,
--- Objdump is only required on OpenBSD and AIX, as mentioned in #211. Add
--- support for platform-specific optional builders as soon as we can reliably
--- test this feature.
+-- 'Objdump' is only required on OpenBSD and AIX. Add support for platform
+-- specific optional builders as soon as we can reliably test this feature.
+-- See https://github.com/snowleopard/hadrian/issues/211.
isOptional :: Builder -> Bool
isOptional = \case
Objdump -> True
diff --git a/src/Hadrian/Package.hs b/src/Hadrian/Package.hs
index c7dc525..11a6998 100644
--- a/src/Hadrian/Package.hs
+++ b/src/Hadrian/Package.hs
@@ -32,7 +32,8 @@ import Hadrian.Utilities
data PackageLanguage = C | Haskell deriving (Generic, Show)
--- TODO: Make PackageType more precise, #12.
+-- TODO: Make PackageType more precise.
+-- See https://github.com/snowleopard/hadrian/issues/12.
data PackageType = Library | Program deriving (Generic, Show)
type PackageName = String
diff --git a/src/Rules/Install.hs b/src/Rules/Install.hs
index ae4a7b0..a34536a 100644
--- a/src/Rules/Install.hs
+++ b/src/Rules/Install.hs
@@ -168,13 +168,13 @@ installPackages = do
rtsLibs <- mapM pkgLibraryFile $ map (Context Stage1 rts) ways
ffiLibs <- sequence $ map rtsLibffiLibrary ways
- -- TODO: Add dynamic ones
+ -- TODO: Add dynamic libraries.
forM_ (rtsLibs ++ ffiLibs) $ \lib -> installData [lib] rtsDir
- -- HACK (issue #327)
+ -- TODO: Remove this hack required for @ghc-cabal copy at .
+ -- See https://github.com/snowleopard/hadrian/issues/327.
ghcBootPlatformHeader <-
buildPath (vanillaContext Stage1 compiler) <&> (-/- "ghc_boot_platform.h")
-
copyFile ghcBootPlatformHeader (pkgPath compiler -/- "ghc_boot_platform.h")
installPackages <- filterM ((isJust <$>) . installStage)
@@ -182,7 +182,7 @@ installPackages = do
installLibPkgs <- topsortPackages (filter isLibrary installPackages)
- -- TODO (izgzhen): figure out what is the root cause of the missing ghc-gmp.h error
+ -- TODO: Figure out what is the root cause of the missing ghc-gmp.h error.
copyFile (pkgPath integerGmp -/- "gmp/ghc-gmp.h") (pkgPath integerGmp -/- "ghc-gmp.h")
forM_ installLibPkgs $ \pkg -> do
@@ -201,13 +201,15 @@ installPackages = do
-- Copy over packages
strip <- stripCmdPath
ways <- interpretInContext context getLibraryWays
- let ghcCabalInplace = inplaceBinPath -/- "ghc-cabal" <.> exe -- HACK?
+ -- TODO: Remove hard-coded @ghc-cabal@ path.
+ let ghcCabalInplace = inplaceBinPath -/- "ghc-cabal" <.> exe
need [ghcCabalInplace]
pkgConf <- pkgConfFile context
- need [cabalFile, pkgConf] -- TODO: check if need pkgConf
+ need [cabalFile, pkgConf] -- TODO: Check if we need 'pkgConf'.
- -- HACK (#318): copy stuff back to the place favored by ghc-cabal
+ -- TODO: Drop redundant copies required by @ghc-cabal at .
+ -- See https://github.com/snowleopard/hadrian/issues/318.
quietly $ copyDirectoryContentsUntracked (Not excluded)
installDistDir (installDistDir -/- "build")
diff --git a/src/Rules/SourceDist.hs b/src/Rules/SourceDist.hs
index f8940c3..3143c4b 100644
--- a/src/Rules/SourceDist.hs
+++ b/src/Rules/SourceDist.hs
@@ -10,7 +10,9 @@ import Rules.Clean
sourceDistRules :: Rules ()
sourceDistRules = do
"sdist-ghc" ~> do
- cleanSourceTree -- We clean the source tree first, see #384
+ -- We clean the source tree first.
+ -- See https://github.com/snowleopard/hadrian/issues/384.
+ cleanSourceTree
version <- setting ProjectVersion
need ["sdistprep/ghc-" ++ version ++ "-src.tar.xz"]
putSuccess "| Done"
diff --git a/src/Rules/Test.hs b/src/Rules/Test.hs
index 294f8f0..ae37343 100644
--- a/src/Rules/Test.hs
+++ b/src/Rules/Test.hs
@@ -17,9 +17,10 @@ testRules = do
needBuilder $ Ghc CompileHs Stage2
needBuilder $ GhcPkg Update Stage1
needBuilder Hpc
+ -- TODO: Figure out why @needBuilder Hsc2Hs@ doesn't work.
+ -- TODO: Eliminate explicit filepaths.
+ -- See https://github.com/snowleopard/hadrian/issues/376.
need ["inplace/bin/hp2ps", "inplace/bin/hsc2hs"]
- -- TODO: Eliminate explicit filepaths in "need" (#376)
- -- FIXME: needBuilder Hsc2Hs doesn't work
build $ target (vanillaContext Stage2 compiler) (Make "testsuite/tests") [] []
"test" ~> do
diff --git a/src/Settings/Packages/Base.hs b/src/Settings/Packages/Base.hs
index bea5210..1124b95 100644
--- a/src/Settings/Packages/Base.hs
+++ b/src/Settings/Packages/Base.hs
@@ -7,5 +7,6 @@ basePackageArgs :: Args
basePackageArgs = package base ? do
integerLibrary <- expr integerLibraryName
mconcat [ builder GhcCabal ? arg ("--flags=" ++ integerLibrary)
- -- Fix the 'unknown symbol stat' issue, see #259.
+ -- This fixes the 'unknown symbol stat' issue.
+ -- See: https://github.com/snowleopard/hadrian/issues/259.
, builder (Ghc CompileCWithGhc) ? arg "-optc-O2" ]
diff --git a/src/Settings/Packages/Rts.hs b/src/Settings/Packages/Rts.hs
index 7282a0e..299d1da 100644
--- a/src/Settings/Packages/Rts.hs
+++ b/src/Settings/Packages/Rts.hs
@@ -109,12 +109,12 @@ rtsPackageArgs = package rts ? do
, arg $ "-I" ++ path
, flag UseSystemFfi ? arg ("-I" ++ ffiIncludeDir)
, arg $ "-DRtsWay=\"rts_" ++ show way ++ "\""
- -- rts *must* be compiled with optimisations. The INLINE_HEADER macro
+ -- RTS *must* be compiled with optimisations. The INLINE_HEADER macro
-- requires that functions are inlined to work as expected. Inlining
-- only happens for optimised builds. Otherwise we can assume that
- -- there is a non-inlined variant to use instead. But rts does not
+ -- there is a non-inlined variant to use instead. But RTS does not
-- provide non-inlined alternatives and hence needs the function to
- -- be inlined. See also #90.
+ -- be inlined. See https://github.com/snowleopard/hadrian/issues/90.
, arg "-O2"
, Debug `wayUnit` way ? arg "-DDEBUG"
More information about the ghc-commits
mailing list