Compare commits
No commits in common. "c8" and "c9s" have entirely different histories.
@ -1,2 +1,2 @@
|
|||||||
a33222646c440826af744ad70447446fb82b74cf SOURCES/ghc-8.2.2-src.tar.xz
|
ff17fba025a6cfe99affd1163f9bf82178556fd2 ghc-8.8.4-src.tar.xz.sig
|
||||||
ce801cf456b8dacd565ce8df8288b4d90e7317ff SOURCES/llvm-3.9.1.src.tar.xz
|
94dfb44d8f6b812a7023309ec909e2288f0e7724 ghc-8.8.4-src.tar.xz
|
||||||
|
35
.gitignore
vendored
35
.gitignore
vendored
@ -1,2 +1,33 @@
|
|||||||
SOURCES/ghc-8.2.2-src.tar.xz
|
ghc-6.12.3-src.tar.bz2
|
||||||
SOURCES/llvm-3.9.1.src.tar.xz
|
testsuite-6.12.3.tar.bz2
|
||||||
|
/ghc-7.0.1-src.tar.bz2
|
||||||
|
/testsuite-7.0.1.tar.bz2
|
||||||
|
/ghc-7.0.2-src.tar.bz2
|
||||||
|
/ghc-7.0.4-src.tar.bz2
|
||||||
|
/testsuite-7.0.4.tar.bz2
|
||||||
|
/ghc-7.4.1-testsuite.tar.bz2
|
||||||
|
/ghc-7.4.1-src.tar.bz2
|
||||||
|
/ghc-7.4.2-src.tar.bz2
|
||||||
|
/ghc-7.4.2-testsuite.tar.bz2
|
||||||
|
/ghc-7.6.3-src.tar.bz2
|
||||||
|
/ghc-7.6.3-testsuite.tar.bz2
|
||||||
|
/ghc-7.6.3/
|
||||||
|
/ghc-7.8.3-src.tar.xz
|
||||||
|
/ghc-7.8.3-testsuite.tar.xz
|
||||||
|
/ghc-7.8.4-src.tar.xz
|
||||||
|
/ghc-7.8.4-testsuite.tar.xz
|
||||||
|
/ghc-7.8.4/
|
||||||
|
/ghc-7.10.3/
|
||||||
|
/ghc-7.10.3b-src.tar.xz
|
||||||
|
/ghc-7.10.3b-testsuite.tar.xz
|
||||||
|
/ghc-8.0.2-testsuite.tar.xz
|
||||||
|
/ghc-8.0.2-src.tar.xz
|
||||||
|
/ghc-8.0.2/
|
||||||
|
/ghc-8.2.2-src.tar.xz
|
||||||
|
/ghc-8.2.2-testsuite.tar.xz
|
||||||
|
/ghc-8.4.4-src.tar.xz
|
||||||
|
/ghc-8.6.5-src.tar.xz
|
||||||
|
/ghc-8.8.3-src.tar.xz
|
||||||
|
/ghc-8.8.3-src.tar.xz.sig
|
||||||
|
/ghc-8.8.4-src.tar.xz.sig
|
||||||
|
/ghc-8.8.4-src.tar.xz
|
||||||
|
27
0001-CMake-Don-t-prefer-python2.7.patch
Normal file
27
0001-CMake-Don-t-prefer-python2.7.patch
Normal file
@ -0,0 +1,27 @@
|
|||||||
|
From 1e0f1c5481a96d760f7840d4dde103353a0131f8 Mon Sep 17 00:00:00 2001
|
||||||
|
From: Tom Stellard <tstellar@redhat.com>
|
||||||
|
Date: Thu, 30 Aug 2018 11:38:51 -0700
|
||||||
|
Subject: [PATCH] CMake: Don't prefer python2.7
|
||||||
|
|
||||||
|
---
|
||||||
|
CMakeLists.txt | 4 ----
|
||||||
|
1 file changed, 4 deletions(-)
|
||||||
|
|
||||||
|
diff --git a/CMakeLists.txt b/CMakeLists.txt
|
||||||
|
index 31df640..2603f1c 100644
|
||||||
|
--- a/CMakeLists.txt
|
||||||
|
+++ b/CMakeLists.txt
|
||||||
|
@@ -613,10 +613,6 @@ message(STATUS "LLVM default target triple: ${LLVM_DEFAULT_TARGET_TRIPLE}")
|
||||||
|
|
||||||
|
include(HandleLLVMOptions)
|
||||||
|
|
||||||
|
-# Verify that we can find a Python 2 interpreter. Python 3 is unsupported.
|
||||||
|
-# FIXME: We should support systems with only Python 3, but that requires work
|
||||||
|
-# on LLDB.
|
||||||
|
-set(Python_ADDITIONAL_VERSIONS 2.7)
|
||||||
|
include(FindPythonInterp)
|
||||||
|
if( NOT PYTHONINTERP_FOUND )
|
||||||
|
message(FATAL_ERROR
|
||||||
|
--
|
||||||
|
1.8.3.1
|
||||||
|
|
24
0001-Don-t-set-rpath-when-installing.patch
Normal file
24
0001-Don-t-set-rpath-when-installing.patch
Normal file
@ -0,0 +1,24 @@
|
|||||||
|
From e67ace2ecb42c24e124f1738dc67b22055a22500 Mon Sep 17 00:00:00 2001
|
||||||
|
From: Tom Stellard <tstellar@redhat.com>
|
||||||
|
Date: Thu, 13 Sep 2018 10:10:08 -0700
|
||||||
|
Subject: [PATCH] Don't set rpath when installing
|
||||||
|
|
||||||
|
---
|
||||||
|
cmake/modules/AddLLVM.cmake | 1 +
|
||||||
|
1 file changed, 1 insertion(+)
|
||||||
|
|
||||||
|
diff --git a/cmake/modules/AddLLVM.cmake b/cmake/modules/AddLLVM.cmake
|
||||||
|
index ce2057f..de309b5 100644
|
||||||
|
--- a/cmake/modules/AddLLVM.cmake
|
||||||
|
+++ b/cmake/modules/AddLLVM.cmake
|
||||||
|
@@ -1621,6 +1621,7 @@ function(llvm_codesign name)
|
||||||
|
endfunction()
|
||||||
|
|
||||||
|
function(llvm_setup_rpath name)
|
||||||
|
+ return()
|
||||||
|
if(CMAKE_INSTALL_RPATH)
|
||||||
|
return()
|
||||||
|
endif()
|
||||||
|
--
|
||||||
|
1.8.3.1
|
||||||
|
|
@ -0,0 +1,60 @@
|
|||||||
|
From 2ad5ac11b17dac347d29191872b2b3d601bbcd1f Mon Sep 17 00:00:00 2001
|
||||||
|
From: Jonas Devlieghere <jonas@devlieghere.com>
|
||||||
|
Date: Fri, 21 Sep 2018 12:03:14 +0000
|
||||||
|
Subject: [PATCH 1/2] Ensure that variant part discriminator is read by
|
||||||
|
MetadataLoader
|
||||||
|
|
||||||
|
https://reviews.llvm.org/D42082 introduced variant parts to debug info
|
||||||
|
in LLVM. Subsequent work on the Rust compiler has found a bug in that
|
||||||
|
patch; namely, there is a path in MetadataLoader that fails to restore
|
||||||
|
the discriminator.
|
||||||
|
|
||||||
|
This patch fixes the bug.
|
||||||
|
|
||||||
|
Patch by: Tom Tromey
|
||||||
|
|
||||||
|
Differential revision: https://reviews.llvm.org/D52340
|
||||||
|
|
||||||
|
llvm-svn: 342725
|
||||||
|
---
|
||||||
|
llvm/lib/Bitcode/Reader/MetadataLoader.cpp | 2 +-
|
||||||
|
llvm/test/Assembler/debug-variant-discriminator.ll | 14 ++++++++++++++
|
||||||
|
2 files changed, 15 insertions(+), 1 deletion(-)
|
||||||
|
create mode 100644 llvm/test/Assembler/debug-variant-discriminator.ll
|
||||||
|
|
||||||
|
diff --git a/lib/Bitcode/Reader/MetadataLoader.cpp b/lib/Bitcode/Reader/MetadataLoader.cpp
|
||||||
|
index 011c41e2cecd..a7b542efc19e 100644
|
||||||
|
--- a/lib/Bitcode/Reader/MetadataLoader.cpp
|
||||||
|
+++ b/lib/Bitcode/Reader/MetadataLoader.cpp
|
||||||
|
@@ -1308,7 +1308,7 @@ Error MetadataLoader::MetadataLoaderImpl::parseOneMetadata(
|
||||||
|
(Context, Tag, Name, File, Line, Scope, BaseType,
|
||||||
|
SizeInBits, AlignInBits, OffsetInBits, Flags,
|
||||||
|
Elements, RuntimeLang, VTableHolder, TemplateParams,
|
||||||
|
- Identifier));
|
||||||
|
+ Identifier, Discriminator));
|
||||||
|
if (!IsNotUsedInTypeRef && Identifier)
|
||||||
|
MetadataList.addTypeRef(*Identifier, *cast<DICompositeType>(CT));
|
||||||
|
|
||||||
|
diff --git a/test/Assembler/debug-variant-discriminator.ll b/test/Assembler/debug-variant-discriminator.ll
|
||||||
|
new file mode 100644
|
||||||
|
index 000000000000..5be001cad6be
|
||||||
|
--- /dev/null
|
||||||
|
+++ b/test/Assembler/debug-variant-discriminator.ll
|
||||||
|
@@ -0,0 +1,14 @@
|
||||||
|
+; RUN: llvm-as < %s | llvm-dis | llvm-as | llvm-dis | FileCheck %s
|
||||||
|
+; RUN: verify-uselistorder %s
|
||||||
|
+
|
||||||
|
+; CHECK: !named = !{!0, !1, !2}
|
||||||
|
+!named = !{!0, !1, !2}
|
||||||
|
+
|
||||||
|
+; CHECK: !0 = !DICompositeType(tag: DW_TAG_structure_type, name: "Outer", size: 64, align: 64, identifier: "Outer")
|
||||||
|
+; CHECK-NEXT: !1 = !DICompositeType(tag: DW_TAG_variant_part, scope: !0, size: 64, discriminator: !2)
|
||||||
|
+; CHECK-NEXT: !2 = !DIDerivedType(tag: DW_TAG_member, scope: !1, baseType: !3, size: 64, align: 64, flags: DIFlagArtificial)
|
||||||
|
+; CHECK-NEXT: !3 = !DIBasicType(name: "u64", size: 64, encoding: DW_ATE_unsigned)
|
||||||
|
+!0 = !DICompositeType(tag: DW_TAG_structure_type, name: "Outer", size: 64, align: 64, identifier: "Outer")
|
||||||
|
+!1 = !DICompositeType(tag: DW_TAG_variant_part, scope: !0, size: 64, discriminator: !2)
|
||||||
|
+!2 = !DIDerivedType(tag: DW_TAG_member, scope: !1, baseType: !3, size: 64, align: 64, flags: DIFlagArtificial)
|
||||||
|
+!3 = !DIBasicType(name: "u64", size: 64, encoding: DW_ATE_unsigned)
|
||||||
|
--
|
||||||
|
2.20.1
|
||||||
|
|
28
0002-test-Fix-Assembler-debug-info.ll.patch
Normal file
28
0002-test-Fix-Assembler-debug-info.ll.patch
Normal file
@ -0,0 +1,28 @@
|
|||||||
|
From 9bfebd6e47cb8513dcd7f7203f29489bdec7bfe4 Mon Sep 17 00:00:00 2001
|
||||||
|
From: Jonas Devlieghere <jonas@devlieghere.com>
|
||||||
|
Date: Fri, 21 Sep 2018 12:28:44 +0000
|
||||||
|
Subject: [PATCH 2/2] [test] Fix Assembler/debug-info.ll
|
||||||
|
|
||||||
|
Update Assembler/debug-info.ll to contain discriminator.
|
||||||
|
|
||||||
|
llvm-svn: 342727
|
||||||
|
---
|
||||||
|
llvm/test/Assembler/debug-info.ll | 2 +-
|
||||||
|
1 file changed, 1 insertion(+), 1 deletion(-)
|
||||||
|
|
||||||
|
diff --git a/test/Assembler/debug-info.ll b/test/Assembler/debug-info.ll
|
||||||
|
index 5dfb8cd93435..605afc3f1587 100644
|
||||||
|
--- a/test/Assembler/debug-info.ll
|
||||||
|
+++ b/test/Assembler/debug-info.ll
|
||||||
|
@@ -83,7 +83,7 @@
|
||||||
|
; CHECK-NEXT: !32 = !DIFile(filename: "file", directory: "dir", checksumkind: CSK_MD5, checksum: "000102030405060708090a0b0c0d0e0f")
|
||||||
|
!35 = !DIFile(filename: "file", directory: "dir", checksumkind: CSK_MD5, checksum: "000102030405060708090a0b0c0d0e0f")
|
||||||
|
|
||||||
|
-; CHECK-NEXT: !33 = !DICompositeType(tag: DW_TAG_variant_part, name: "A", scope: !14, size: 64)
|
||||||
|
+; CHECK-NEXT: !33 = !DICompositeType(tag: DW_TAG_variant_part, name: "A", scope: !14, size: 64, discriminator: !34)
|
||||||
|
; CHECK-NEXT: !34 = !DIDerivedType(tag: DW_TAG_member, scope: !33, baseType: !35, size: 64, align: 64, flags: DIFlagArtificial)
|
||||||
|
; CHECK-NEXT: !35 = !DIBasicType(name: "u64", size: 64, encoding: DW_ATE_unsigned)
|
||||||
|
!36 = !DICompositeType(tag: DW_TAG_variant_part, name: "A", scope: !16, size: 64, discriminator: !37)
|
||||||
|
--
|
||||||
|
2.20.1
|
||||||
|
|
277
6e361d895dda4600a85e01c72ff219474b5c7190.patch
Normal file
277
6e361d895dda4600a85e01c72ff219474b5c7190.patch
Normal file
@ -0,0 +1,277 @@
|
|||||||
|
From 6e361d895dda4600a85e01c72ff219474b5c7190 Mon Sep 17 00:00:00 2001
|
||||||
|
From: Kavon Farvardin <kavon@farvard.in>
|
||||||
|
Date: Thu, 4 Oct 2018 13:44:55 -0400
|
||||||
|
Subject: [PATCH] Multiple fixes / improvements for LLVM backend
|
||||||
|
|
||||||
|
- Fix for #13904 -- stop "trashing" callee-saved registers, since it is
|
||||||
|
not actually doing anything useful.
|
||||||
|
|
||||||
|
- Fix for #14251 -- fixes the calling convention for functions passing
|
||||||
|
raw SSE-register values by adding padding as needed to get the values
|
||||||
|
in the right registers. This problem cropped up when some args were
|
||||||
|
unused an dropped from the live list.
|
||||||
|
|
||||||
|
- Fixed a typo in 'readnone' attribute
|
||||||
|
|
||||||
|
- Added 'lower-expect' pass to level 0 LLVM optimization passes to
|
||||||
|
improve block layout in LLVM for stack checks, etc.
|
||||||
|
|
||||||
|
Test Plan: `make test WAYS=optllvm` and `make test WAYS=llvm`
|
||||||
|
|
||||||
|
Reviewers: bgamari, simonmar, angerman
|
||||||
|
|
||||||
|
Reviewed By: angerman
|
||||||
|
|
||||||
|
Subscribers: rwbarton, carter
|
||||||
|
|
||||||
|
GHC Trac Issues: #13904, #14251
|
||||||
|
|
||||||
|
Differential Revision: https://phabricator.haskell.org/D5190
|
||||||
|
|
||||||
|
(cherry picked from commit adcb5fb47c0942671d409b940d8884daa9359ca4)
|
||||||
|
---
|
||||||
|
compiler/llvmGen/Llvm/Types.hs | 2 +-
|
||||||
|
compiler/llvmGen/LlvmCodeGen/Base.hs | 62 ++++++++++++++++++++----
|
||||||
|
compiler/llvmGen/LlvmCodeGen/CodeGen.hs | 59 +++++-----------------
|
||||||
|
compiler/main/DriverPipeline.hs | 2 +-
|
||||||
|
testsuite/tests/codeGen/should_run/all.T | 4 +-
|
||||||
|
5 files changed, 67 insertions(+), 62 deletions(-)
|
||||||
|
|
||||||
|
diff --git a/compiler/llvmGen/Llvm/Types.hs b/compiler/llvmGen/Llvm/Types.hs
|
||||||
|
index 87111499fc0..c1c51afcf0f 100644
|
||||||
|
--- a/compiler/llvmGen/Llvm/Types.hs
|
||||||
|
+++ b/compiler/llvmGen/Llvm/Types.hs
|
||||||
|
@@ -560,7 +560,7 @@ instance Outputable LlvmFuncAttr where
|
||||||
|
ppr OptSize = text "optsize"
|
||||||
|
ppr NoReturn = text "noreturn"
|
||||||
|
ppr NoUnwind = text "nounwind"
|
||||||
|
- ppr ReadNone = text "readnon"
|
||||||
|
+ ppr ReadNone = text "readnone"
|
||||||
|
ppr ReadOnly = text "readonly"
|
||||||
|
ppr Ssp = text "ssp"
|
||||||
|
ppr SspReq = text "ssqreq"
|
||||||
|
diff --git a/compiler/llvmGen/LlvmCodeGen/Base.hs b/compiler/llvmGen/LlvmCodeGen/Base.hs
|
||||||
|
index 6e20da48c1b..ec91bacc4c8 100644
|
||||||
|
--- a/compiler/llvmGen/LlvmCodeGen/Base.hs
|
||||||
|
+++ b/compiler/llvmGen/LlvmCodeGen/Base.hs
|
||||||
|
@@ -26,7 +26,7 @@ module LlvmCodeGen.Base (
|
||||||
|
|
||||||
|
cmmToLlvmType, widthToLlvmFloat, widthToLlvmInt, llvmFunTy,
|
||||||
|
llvmFunSig, llvmFunArgs, llvmStdFunAttrs, llvmFunAlign, llvmInfAlign,
|
||||||
|
- llvmPtrBits, tysToParams, llvmFunSection,
|
||||||
|
+ llvmPtrBits, tysToParams, llvmFunSection, padLiveArgs, isSSE,
|
||||||
|
|
||||||
|
strCLabel_llvm, strDisplayName_llvm, strProcedureName_llvm,
|
||||||
|
getGlobalPtr, generateExternDecls,
|
||||||
|
@@ -58,6 +58,8 @@ import ErrUtils
|
||||||
|
import qualified Stream
|
||||||
|
|
||||||
|
import Control.Monad (ap)
|
||||||
|
+import Data.List (sort)
|
||||||
|
+import Data.Maybe (mapMaybe)
|
||||||
|
|
||||||
|
-- ----------------------------------------------------------------------------
|
||||||
|
-- * Some Data Types
|
||||||
|
@@ -147,16 +149,58 @@ llvmFunSection dflags lbl
|
||||||
|
-- | A Function's arguments
|
||||||
|
llvmFunArgs :: DynFlags -> LiveGlobalRegs -> [LlvmVar]
|
||||||
|
llvmFunArgs dflags live =
|
||||||
|
- map (lmGlobalRegArg dflags) (filter isPassed (activeStgRegs platform))
|
||||||
|
+ map (lmGlobalRegArg dflags) (filter isPassed allRegs)
|
||||||
|
where platform = targetPlatform dflags
|
||||||
|
- isLive r = not (isSSE r) || r `elem` alwaysLive || r `elem` live
|
||||||
|
+ allRegs = activeStgRegs platform
|
||||||
|
+ paddedLive = map (\(_,r) -> r) $ padLiveArgs live
|
||||||
|
+ isLive r = r `elem` alwaysLive || r `elem` paddedLive
|
||||||
|
isPassed r = not (isSSE r) || isLive r
|
||||||
|
- isSSE (FloatReg _) = True
|
||||||
|
- isSSE (DoubleReg _) = True
|
||||||
|
- isSSE (XmmReg _) = True
|
||||||
|
- isSSE (YmmReg _) = True
|
||||||
|
- isSSE (ZmmReg _) = True
|
||||||
|
- isSSE _ = False
|
||||||
|
+
|
||||||
|
+
|
||||||
|
+isSSE :: GlobalReg -> Bool
|
||||||
|
+isSSE (FloatReg _) = True
|
||||||
|
+isSSE (DoubleReg _) = True
|
||||||
|
+isSSE (XmmReg _) = True
|
||||||
|
+isSSE (YmmReg _) = True
|
||||||
|
+isSSE (ZmmReg _) = True
|
||||||
|
+isSSE _ = False
|
||||||
|
+
|
||||||
|
+sseRegNum :: GlobalReg -> Maybe Int
|
||||||
|
+sseRegNum (FloatReg i) = Just i
|
||||||
|
+sseRegNum (DoubleReg i) = Just i
|
||||||
|
+sseRegNum (XmmReg i) = Just i
|
||||||
|
+sseRegNum (YmmReg i) = Just i
|
||||||
|
+sseRegNum (ZmmReg i) = Just i
|
||||||
|
+sseRegNum _ = Nothing
|
||||||
|
+
|
||||||
|
+-- the bool indicates whether the global reg was added as padding.
|
||||||
|
+-- the returned list is not sorted in any particular order,
|
||||||
|
+-- but does indicate the set of live registers needed, with SSE padding.
|
||||||
|
+padLiveArgs :: LiveGlobalRegs -> [(Bool, GlobalReg)]
|
||||||
|
+padLiveArgs live = allRegs
|
||||||
|
+ where
|
||||||
|
+ sseRegNums = sort $ mapMaybe sseRegNum live
|
||||||
|
+ (_, padding) = foldl assignSlots (1, []) $ sseRegNums
|
||||||
|
+ allRegs = padding ++ map (\r -> (False, r)) live
|
||||||
|
+
|
||||||
|
+ assignSlots (i, acc) regNum
|
||||||
|
+ | i == regNum = -- don't need padding here
|
||||||
|
+ (i+1, acc)
|
||||||
|
+ | i < regNum = let -- add padding for slots i .. regNum-1
|
||||||
|
+ numNeeded = regNum-i
|
||||||
|
+ acc' = genPad i numNeeded ++ acc
|
||||||
|
+ in
|
||||||
|
+ (regNum+1, acc')
|
||||||
|
+ | otherwise = error "padLiveArgs -- i > regNum ??"
|
||||||
|
+
|
||||||
|
+ genPad start n =
|
||||||
|
+ take n $ flip map (iterate (+1) start) (\i ->
|
||||||
|
+ (True, FloatReg i))
|
||||||
|
+ -- NOTE: Picking float should be fine for the following reasons:
|
||||||
|
+ -- (1) Float aliases with all the other SSE register types on
|
||||||
|
+ -- the given platform.
|
||||||
|
+ -- (2) The argument is not live anyways.
|
||||||
|
+
|
||||||
|
|
||||||
|
-- | Llvm standard fun attributes
|
||||||
|
llvmStdFunAttrs :: [LlvmFuncAttr]
|
||||||
|
diff --git a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
|
||||||
|
index e812dd445f1..a7121b7909a 100644
|
||||||
|
--- a/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
|
||||||
|
+++ b/compiler/llvmGen/LlvmCodeGen/CodeGen.hs
|
||||||
|
@@ -14,7 +14,7 @@ import LlvmCodeGen.Base
|
||||||
|
import LlvmCodeGen.Regs
|
||||||
|
|
||||||
|
import BlockId
|
||||||
|
-import CodeGen.Platform ( activeStgRegs, callerSaves )
|
||||||
|
+import CodeGen.Platform ( activeStgRegs )
|
||||||
|
import CLabel
|
||||||
|
import Cmm
|
||||||
|
import PprCmm
|
||||||
|
@@ -211,7 +211,6 @@ genCall t@(PrimTarget (MO_Prefetch_Data localityInt)) [] args
|
||||||
|
fptr <- liftExprData $ getFunPtr funTy t
|
||||||
|
argVars' <- castVarsW Signed $ zip argVars argTy
|
||||||
|
|
||||||
|
- doTrashStmts
|
||||||
|
let argSuffix = [mkIntLit i32 0, mkIntLit i32 localityInt, mkIntLit i32 1]
|
||||||
|
statement $ Expr $ Call StdCall fptr (argVars' ++ argSuffix) []
|
||||||
|
| otherwise = panic $ "prefetch locality level integer must be between 0 and 3, given: " ++ (show localityInt)
|
||||||
|
@@ -294,7 +293,6 @@ genCall t@(PrimTarget op) [] args
|
||||||
|
fptr <- getFunPtrW funTy t
|
||||||
|
argVars' <- castVarsW Signed $ zip argVars argTy
|
||||||
|
|
||||||
|
- doTrashStmts
|
||||||
|
let alignVal = mkIntLit i32 align
|
||||||
|
arguments = argVars' ++ (alignVal:isVolVal)
|
||||||
|
statement $ Expr $ Call StdCall fptr arguments []
|
||||||
|
@@ -446,7 +444,6 @@ genCall target res args = runStmtsDecls $ do
|
||||||
|
| never_returns = statement $ Unreachable
|
||||||
|
| otherwise = return ()
|
||||||
|
|
||||||
|
- doTrashStmts
|
||||||
|
|
||||||
|
-- make the actual call
|
||||||
|
case retTy of
|
||||||
|
@@ -1759,12 +1756,9 @@ genLit _ CmmHighStackMark
|
||||||
|
funPrologue :: LiveGlobalRegs -> [CmmBlock] -> LlvmM StmtData
|
||||||
|
funPrologue live cmmBlocks = do
|
||||||
|
|
||||||
|
- trash <- getTrashRegs
|
||||||
|
let getAssignedRegs :: CmmNode O O -> [CmmReg]
|
||||||
|
getAssignedRegs (CmmAssign reg _) = [reg]
|
||||||
|
- -- Calls will trash all registers. Unfortunately, this needs them to
|
||||||
|
- -- be stack-allocated in the first place.
|
||||||
|
- getAssignedRegs (CmmUnsafeForeignCall _ rs _) = map CmmGlobal trash ++ map CmmLocal rs
|
||||||
|
+ getAssignedRegs (CmmUnsafeForeignCall _ rs _) = map CmmLocal rs
|
||||||
|
getAssignedRegs _ = []
|
||||||
|
getRegsBlock (_, body, _) = concatMap getAssignedRegs $ blockToList body
|
||||||
|
assignedRegs = nub $ concatMap (getRegsBlock . blockSplit) cmmBlocks
|
||||||
|
@@ -1794,14 +1788,9 @@ funPrologue live cmmBlocks = do
|
||||||
|
funEpilogue :: LiveGlobalRegs -> LlvmM ([LlvmVar], LlvmStatements)
|
||||||
|
funEpilogue live = do
|
||||||
|
|
||||||
|
- -- Have information and liveness optimisation is enabled?
|
||||||
|
- let liveRegs = alwaysLive ++ live
|
||||||
|
- isSSE (FloatReg _) = True
|
||||||
|
- isSSE (DoubleReg _) = True
|
||||||
|
- isSSE (XmmReg _) = True
|
||||||
|
- isSSE (YmmReg _) = True
|
||||||
|
- isSSE (ZmmReg _) = True
|
||||||
|
- isSSE _ = False
|
||||||
|
+ -- the bool indicates whether the register is padding.
|
||||||
|
+ let alwaysNeeded = map (\r -> (False, r)) alwaysLive
|
||||||
|
+ livePadded = alwaysNeeded ++ padLiveArgs live
|
||||||
|
|
||||||
|
-- Set to value or "undef" depending on whether the register is
|
||||||
|
-- actually live
|
||||||
|
@@ -1813,39 +1802,17 @@ funEpilogue live = do
|
||||||
|
let ty = (pLower . getVarType $ lmGlobalRegVar dflags r)
|
||||||
|
return (Just $ LMLitVar $ LMUndefLit ty, nilOL)
|
||||||
|
platform <- getDynFlag targetPlatform
|
||||||
|
- loads <- flip mapM (activeStgRegs platform) $ \r -> case () of
|
||||||
|
- _ | r `elem` liveRegs -> loadExpr r
|
||||||
|
- | not (isSSE r) -> loadUndef r
|
||||||
|
+ let allRegs = activeStgRegs platform
|
||||||
|
+ loads <- flip mapM allRegs $ \r -> case () of
|
||||||
|
+ _ | (False, r) `elem` livePadded
|
||||||
|
+ -> loadExpr r -- if r is not padding, load it
|
||||||
|
+ | not (isSSE r) || (True, r) `elem` livePadded
|
||||||
|
+ -> loadUndef r
|
||||||
|
| otherwise -> return (Nothing, nilOL)
|
||||||
|
|
||||||
|
let (vars, stmts) = unzip loads
|
||||||
|
return (catMaybes vars, concatOL stmts)
|
||||||
|
|
||||||
|
-
|
||||||
|
--- | A series of statements to trash all the STG registers.
|
||||||
|
---
|
||||||
|
--- In LLVM we pass the STG registers around everywhere in function calls.
|
||||||
|
--- So this means LLVM considers them live across the entire function, when
|
||||||
|
--- in reality they usually aren't. For Caller save registers across C calls
|
||||||
|
--- the saving and restoring of them is done by the Cmm code generator,
|
||||||
|
--- using Cmm local vars. So to stop LLVM saving them as well (and saving
|
||||||
|
--- all of them since it thinks they're always live, we trash them just
|
||||||
|
--- before the call by assigning the 'undef' value to them. The ones we
|
||||||
|
--- need are restored from the Cmm local var and the ones we don't need
|
||||||
|
--- are fine to be trashed.
|
||||||
|
-getTrashStmts :: LlvmM LlvmStatements
|
||||||
|
-getTrashStmts = do
|
||||||
|
- regs <- getTrashRegs
|
||||||
|
- stmts <- flip mapM regs $ \ r -> do
|
||||||
|
- reg <- getCmmReg (CmmGlobal r)
|
||||||
|
- let ty = (pLower . getVarType) reg
|
||||||
|
- return $ Store (LMLitVar $ LMUndefLit ty) reg
|
||||||
|
- return $ toOL stmts
|
||||||
|
-
|
||||||
|
-getTrashRegs :: LlvmM [GlobalReg]
|
||||||
|
-getTrashRegs = do plat <- getLlvmPlatform
|
||||||
|
- return $ filter (callerSaves plat) (activeStgRegs plat)
|
||||||
|
-
|
||||||
|
-- | Get a function pointer to the CLabel specified.
|
||||||
|
--
|
||||||
|
-- This is for Haskell functions, function type is assumed, so doesn't work
|
||||||
|
@@ -1967,7 +1934,3 @@ getCmmRegW = lift . getCmmReg
|
||||||
|
genLoadW :: Atomic -> CmmExpr -> CmmType -> WriterT LlvmAccum LlvmM LlvmVar
|
||||||
|
genLoadW atomic e ty = liftExprData $ genLoad atomic e ty
|
||||||
|
|
||||||
|
-doTrashStmts :: WriterT LlvmAccum LlvmM ()
|
||||||
|
-doTrashStmts = do
|
||||||
|
- stmts <- lift getTrashStmts
|
||||||
|
- tell $ LlvmAccum stmts mempty
|
||||||
|
diff --git a/compiler/main/DriverPipeline.hs b/compiler/main/DriverPipeline.hs
|
||||||
|
index 86dd913461c..f4d5e7f553c 100644
|
||||||
|
--- a/compiler/main/DriverPipeline.hs
|
||||||
|
+++ b/compiler/main/DriverPipeline.hs
|
||||||
|
@@ -1465,7 +1465,7 @@ runPhase (RealPhase LlvmOpt) input_fn dflags
|
||||||
|
-- we always (unless -optlo specified) run Opt since we rely on it to
|
||||||
|
-- fix up some pretty big deficiencies in the code we generate
|
||||||
|
llvmOpts = case optLevel dflags of
|
||||||
|
- 0 -> "-mem2reg -globalopt"
|
||||||
|
+ 0 -> "-mem2reg -globalopt -lower-expect"
|
||||||
|
1 -> "-O1 -globalopt"
|
||||||
|
_ -> "-O2"
|
||||||
|
|
10
Disable-unboxed-arrays.patch
Normal file
10
Disable-unboxed-arrays.patch
Normal file
@ -0,0 +1,10 @@
|
|||||||
|
--- ghc-8.8.0.20190721/libraries/containers/containers/include/containers.h~ 2019-06-26 20:39:26.000000000 +0000
|
||||||
|
+++ ghc-8.8.0.20190721/libraries/containers/containers/include/containers.h 2019-07-27 08:55:10.747060247 +0000
|
||||||
|
@@ -35,7 +35,6 @@
|
||||||
|
|
||||||
|
#ifdef __GLASGOW_HASKELL__
|
||||||
|
# define USE_ST_MONAD 1
|
||||||
|
-# define USE_UNBOXED_ARRAYS 1
|
||||||
|
#endif
|
||||||
|
|
||||||
|
#endif
|
@ -1,70 +0,0 @@
|
|||||||
diff --git a/utils/ghc-pkg/Main.hs b/utils/ghc-pkg/Main.hs
|
|
||||||
--- a/utils/ghc-pkg/Main.hs
|
|
||||||
+++ b/utils/ghc-pkg/Main.hs
|
|
||||||
@@ -1208,7 +1208,18 @@
|
|
||||||
pkgsCabalFormat = packages db
|
|
||||||
|
|
||||||
pkgsGhcCacheFormat :: [PackageCacheFormat]
|
|
||||||
- pkgsGhcCacheFormat = map convertPackageInfoToCacheFormat pkgsCabalFormat
|
|
||||||
+ pkgsGhcCacheFormat
|
|
||||||
+ = map (recomputeValidAbiDeps pkgsCabalFormat) -- Note [Recompute abi-depends]
|
|
||||||
+ $ map convertPackageInfoToCacheFormat
|
|
||||||
+ pkgsCabalFormat
|
|
||||||
+
|
|
||||||
+ hasAnyAbiDepends :: InstalledPackageInfo -> Bool
|
|
||||||
+ hasAnyAbiDepends x = length (abiDepends x) > 0
|
|
||||||
+
|
|
||||||
+-- -- warn when we find any (possibly-)bogus abi-depends fields;
|
|
||||||
+-- -- Note [Recompute abi-depends]
|
|
||||||
+-- when (any hasAnyAbiDepends pkgsCabalFormat) $
|
|
||||||
+-- infoLn "ignoring (possibly broken) abi-depends field for packages"
|
|
||||||
|
|
||||||
when (verbosity > Normal) $
|
|
||||||
infoLn ("writing cache " ++ filename)
|
|
||||||
@@ -1231,6 +1242,45 @@
|
|
||||||
ModuleName
|
|
||||||
OpenModule
|
|
||||||
|
|
||||||
+{- Note [Recompute abi-depends]
|
|
||||||
+~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
|
|
||||||
+
|
|
||||||
+Like most fields, `ghc-pkg` relies on who-ever is performing package
|
|
||||||
+registration to fill in fields; this includes the `abi-depends` field present
|
|
||||||
+for the package.
|
|
||||||
+
|
|
||||||
+However, this was likely a mistake, and is not very robust; in certain cases,
|
|
||||||
+versions of Cabal may use bogus abi-depends fields for a package when doing
|
|
||||||
+builds. Why? Because package database information is aggressively cached; it is
|
|
||||||
+possible to work Cabal into a situation where it uses a cached version of
|
|
||||||
+`abi-depends`, rather than the one in the actual database after it has been
|
|
||||||
+recomputed.
|
|
||||||
+
|
|
||||||
+However, there is an easy fix: ghc-pkg /already/ knows the `abi-depends` of a
|
|
||||||
+package, because they are the ABIs of the packages pointed at by the `depends`
|
|
||||||
+field. So it can simply look up the abi from the dependencies in the original
|
|
||||||
+database, and ignore whatever the system registering gave it.
|
|
||||||
+
|
|
||||||
+So, instead, we do two things here:
|
|
||||||
+
|
|
||||||
+ - We throw away the information for a registered package's `abi-depends` field.
|
|
||||||
+
|
|
||||||
+ - We recompute it: we simply look up the unit ID of the package in the original
|
|
||||||
+ database, and use *its* abi-depends.
|
|
||||||
+
|
|
||||||
+See Trac #14381, and Cabal issue #4728.
|
|
||||||
+
|
|
||||||
+-}
|
|
||||||
+
|
|
||||||
+recomputeValidAbiDeps :: [InstalledPackageInfo] -> PackageCacheFormat -> PackageCacheFormat
|
|
||||||
+recomputeValidAbiDeps db pkg = pkg { GhcPkg.abiDepends = catMaybes (newAbiDeps) }
|
|
||||||
+ where
|
|
||||||
+ newAbiDeps = flip map (GhcPkg.abiDepends pkg) $ \(k, _) ->
|
|
||||||
+ case filter (\d -> installedUnitId d == k) db of
|
|
||||||
+ [] -> Nothing
|
|
||||||
+ [x] -> Just (k, unAbiHash (abiHash x))
|
|
||||||
+ _ -> Nothing -- ???
|
|
||||||
+
|
|
||||||
convertPackageInfoToCacheFormat :: InstalledPackageInfo -> PackageCacheFormat
|
|
||||||
convertPackageInfoToCacheFormat pkg =
|
|
||||||
GhcPkg.InstalledPackageInfo {
|
|
||||||
|
|
@ -1,20 +0,0 @@
|
|||||||
--- ghc-8.2.2/libraries/Cabal/Cabal/Distribution/Simple/Install.hs~ 2017-05-05 16:51:43.000000000 +0200
|
|
||||||
+++ ghc-8.2.2/libraries/Cabal/Cabal/Distribution/Simple/Install.hs 2018-01-23 23:05:47.047081056 +0100
|
|
||||||
@@ -36,7 +36,7 @@
|
|
||||||
import Distribution.Simple.Utils
|
|
||||||
( createDirectoryIfMissingVerbose
|
|
||||||
, installDirectoryContents, installOrdinaryFile, isInSearchPath
|
|
||||||
- , die', info, noticeNoWrap, warn, matchDirFileGlob )
|
|
||||||
+ , die', info, noticeNoWrap, warn, matchDirFileGlob, debug )
|
|
||||||
import Distribution.Simple.Compiler
|
|
||||||
( CompilerFlavor(..), compilerFlavor )
|
|
||||||
import Distribution.Simple.Setup
|
|
||||||
@@ -215,7 +215,7 @@
|
|
||||||
++ " in " ++ binPref)
|
|
||||||
inPath <- isInSearchPath binPref
|
|
||||||
when (not inPath) $
|
|
||||||
- warn verbosity ("The directory " ++ binPref
|
|
||||||
+ debug verbosity ("The directory " ++ binPref
|
|
||||||
++ " is not in the system search path.")
|
|
||||||
case compilerFlavor (compiler lbi) of
|
|
||||||
GHC -> GHC.installExe verbosity lbi binPref buildPref progFix pkg_descr exe
|
|
@ -1,43 +0,0 @@
|
|||||||
This is an attempt to make GHC build reproducible. The name of .c files may end
|
|
||||||
up in the resulting binary (in the debug section), but not the directory.
|
|
||||||
|
|
||||||
Instead of using the process id, create a hash from the command line arguments,
|
|
||||||
and assume that is going to be unique.
|
|
||||||
|
|
||||||
Index: ghc-8.0.2/compiler/main/SysTools.hs
|
|
||||||
===================================================================
|
|
||||||
--- ghc-8.0.2.orig/compiler/main/SysTools.hs
|
|
||||||
+++ ghc-8.0.2/compiler/main/SysTools.hs
|
|
||||||
@@ -65,6 +65,7 @@
|
|
||||||
import Util
|
|
||||||
import DynFlags
|
|
||||||
import Exception
|
|
||||||
+import Fingerprint
|
|
||||||
|
|
||||||
import LlvmCodeGen.Base (llvmVersionStr, supportedLlvmVersion)
|
|
||||||
|
|
||||||
@@ -1145,8 +1146,8 @@
|
|
||||||
mapping <- readIORef dir_ref
|
|
||||||
case Map.lookup tmp_dir mapping of
|
|
||||||
Nothing -> do
|
|
||||||
- pid <- getProcessID
|
|
||||||
- let prefix = tmp_dir </> "ghc" ++ show pid ++ "_"
|
|
||||||
+ pid <- getStableProcessID
|
|
||||||
+ let prefix = tmp_dir </> "ghc" ++ pid ++ "_"
|
|
||||||
mask_ $ mkTempDir prefix
|
|
||||||
Just dir -> return dir
|
|
||||||
where
|
|
||||||
@@ -1562,6 +1563,13 @@
|
|
||||||
getProcessID = System.Posix.Internals.c_getpid >>= return . fromIntegral
|
|
||||||
#endif
|
|
||||||
|
|
||||||
+-- Debian-specific hack to get reproducible output, by not using the "random"
|
|
||||||
+-- pid, but rather something determinisic
|
|
||||||
+getStableProcessID :: IO String
|
|
||||||
+getStableProcessID = do
|
|
||||||
+ args <- getArgs
|
|
||||||
+ return $ take 4 $ show $ fingerprintString $ unwords args
|
|
||||||
+
|
|
||||||
-- Divvy up text stream into lines, taking platform dependent
|
|
||||||
-- line termination into account.
|
|
||||||
linesPlatform :: String -> [String]
|
|
@ -1,11 +0,0 @@
|
|||||||
--- ghc-8.2.2/configure.ac~ 2017-11-21 05:22:42.000000000 +0900
|
|
||||||
+++ ghc-8.2.2/configure.ac 2018-05-28 12:37:35.296728423 +0900
|
|
||||||
@@ -745,7 +745,7 @@
|
|
||||||
AC_CACHE_CHECK([for version of sphinx-build], fp_cv_sphinx_version,
|
|
||||||
changequote(, )dnl
|
|
||||||
[if test -n "$SPHINXBUILD"; then
|
|
||||||
- fp_cv_sphinx_version=`"$SPHINXBUILD" --version 2>&1 | sed 's/Sphinx\( (sphinx-build)\)\? v\?\([0-9]\.[0-9]\.[0-9]\)/\2/' | head -n1`;
|
|
||||||
+ fp_cv_sphinx_version=`"$SPHINXBUILD" --version 2>&1 | sed 's/.* v\?\([0-9]\.[0-9]\.[0-9]\)/\1/' | head -n1`;
|
|
||||||
fi;
|
|
||||||
changequote([, ])dnl
|
|
||||||
])
|
|
@ -1,38 +0,0 @@
|
|||||||
#!/bin/sh
|
|
||||||
|
|
||||||
LOCKFILE=/var/lock/ghc-doc-index.lock
|
|
||||||
|
|
||||||
# the lockfile is not meant to be perfect, it's just in case
|
|
||||||
# two cron scripts get run close to each other to keep
|
|
||||||
# them from stepping on each other's toes.
|
|
||||||
if [ -f $LOCKFILE ]; then
|
|
||||||
echo "Locked with $LOCKFILE"
|
|
||||||
exit 0
|
|
||||||
fi
|
|
||||||
|
|
||||||
if [ "$(id -u)" != "0" ]; then
|
|
||||||
echo Need to be root!
|
|
||||||
exit 1
|
|
||||||
fi
|
|
||||||
|
|
||||||
trap "{ rm -f $LOCKFILE ; exit 255; }" EXIT
|
|
||||||
touch $LOCKFILE
|
|
||||||
|
|
||||||
PKGDIRCACHE=/var/lib/ghc/pkg-dir.cache
|
|
||||||
LISTING="env LANG=C ls -dl"
|
|
||||||
|
|
||||||
# only re-index ghc docs when there are changes
|
|
||||||
cd /usr/share/doc/ghc/html/libraries
|
|
||||||
if [ -r "$PKGDIRCACHE" ]; then
|
|
||||||
$LISTING */ > $PKGDIRCACHE.new
|
|
||||||
DIR_DIFF=$(diff $PKGDIRCACHE $PKGDIRCACHE.new)
|
|
||||||
else
|
|
||||||
$LISTING */ > $PKGDIRCACHE
|
|
||||||
fi
|
|
||||||
if [ -x "gen_contents_index" -a ! -r "$PKGDIRCACHE.new" -o -n "$DIR_DIFF" ]; then
|
|
||||||
./gen_contents_index
|
|
||||||
fi
|
|
||||||
|
|
||||||
if [ -f $PKGDIRCACHE.new ]; then
|
|
||||||
mv -f $PKGDIRCACHE.new $PKGDIRCACHE
|
|
||||||
fi
|
|
@ -1,9 +0,0 @@
|
|||||||
#! /bin/bash
|
|
||||||
# updates the library documentation index after updates
|
|
||||||
|
|
||||||
# This can be disabled by uninstalling ghc-doc-index
|
|
||||||
# or adding ghc-doc-index to "./jobs-deny".
|
|
||||||
|
|
||||||
/usr/bin/ghc-doc-index
|
|
||||||
|
|
||||||
exit 0
|
|
@ -1,83 +0,0 @@
|
|||||||
From 417001588d232151050db2d32df443e2d073ebbf Mon Sep 17 00:00:00 2001
|
|
||||||
From: Valentin Churavy <v.churavy@gmail.com>
|
|
||||||
Date: Fri, 21 Oct 2016 17:25:04 +0900
|
|
||||||
Subject: [PATCH] Fix llvm-shlib cmake build
|
|
||||||
|
|
||||||
Summary:
|
|
||||||
This fixes a few things that used to work with a Makefile build, but were broken in cmake.
|
|
||||||
|
|
||||||
1. Treat MINGW like a Linux system.
|
|
||||||
2. The shlib should never contain other shared libraries.
|
|
||||||
|
|
||||||
Subscribers: beanz, mgorny
|
|
||||||
|
|
||||||
Differential Revision: https://reviews.llvm.org/D25865
|
|
||||||
---
|
|
||||||
tools/llvm-shlib/CMakeLists.txt | 42 ++++++++++++++++++++---------------------
|
|
||||||
1 file changed, 20 insertions(+), 22 deletions(-)
|
|
||||||
|
|
||||||
diff --git a/tools/llvm-shlib/CMakeLists.txt b/tools/llvm-shlib/CMakeLists.txt
|
|
||||||
index 3fe672d..edadb82 100644
|
|
||||||
--- a/tools/llvm-shlib/CMakeLists.txt
|
|
||||||
+++ b/tools/llvm-shlib/CMakeLists.txt
|
|
||||||
@@ -8,29 +8,27 @@ set(SOURCES
|
|
||||||
|
|
||||||
llvm_map_components_to_libnames(LIB_NAMES ${LLVM_DYLIB_COMPONENTS})
|
|
||||||
|
|
||||||
-if(LLVM_LINK_LLVM_DYLIB)
|
|
||||||
- if(LLVM_DYLIB_EXPORTED_SYMBOL_FILE)
|
|
||||||
- message(WARNING "Using LLVM_LINK_LLVM_DYLIB with LLVM_DYLIB_EXPORTED_SYMBOL_FILE may not work. Use at your own risk.")
|
|
||||||
- endif()
|
|
||||||
-
|
|
||||||
- # libLLVM.so should not have any dependencies on any other LLVM
|
|
||||||
- # shared libraries. When using the "all" pseudo-component,
|
|
||||||
- # LLVM_AVAILABLE_LIBS is added to the dependencies, which may
|
|
||||||
- # contain shared libraries (e.g. libLTO).
|
|
||||||
- #
|
|
||||||
- # Also exclude libLLVMTableGen for the following reasons:
|
|
||||||
- # - it is only used by internal *-tblgen utilities;
|
|
||||||
- # - it pollutes the global options space.
|
|
||||||
- foreach(lib ${LIB_NAMES})
|
|
||||||
- get_target_property(t ${lib} TYPE)
|
|
||||||
- if("${lib}" STREQUAL "LLVMTableGen")
|
|
||||||
- elseif("x${t}" STREQUAL "xSTATIC_LIBRARY")
|
|
||||||
- list(APPEND FILTERED_LIB_NAMES ${lib})
|
|
||||||
- endif()
|
|
||||||
- endforeach()
|
|
||||||
- set(LIB_NAMES ${FILTERED_LIB_NAMES})
|
|
||||||
+if(LLVM_LINK_LLVM_DYLIB AND LLVM_DYLIB_EXPORTED_SYMBOL_FILE)
|
|
||||||
+ message(WARNING "Using LLVM_LINK_LLVM_DYLIB with LLVM_DYLIB_EXPORTED_SYMBOL_FILE may not work. Use at your own risk.")
|
|
||||||
endif()
|
|
||||||
|
|
||||||
+# libLLVM.so should not have any dependencies on any other LLVM
|
|
||||||
+# shared libraries. When using the "all" pseudo-component,
|
|
||||||
+# LLVM_AVAILABLE_LIBS is added to the dependencies, which may
|
|
||||||
+# contain shared libraries (e.g. libLTO).
|
|
||||||
+#
|
|
||||||
+# Also exclude libLLVMTableGen for the following reasons:
|
|
||||||
+# - it is only used by internal *-tblgen utilities;
|
|
||||||
+# - it pollutes the global options space.
|
|
||||||
+foreach(lib ${LIB_NAMES})
|
|
||||||
+ get_target_property(t ${lib} TYPE)
|
|
||||||
+ if("${lib}" STREQUAL "LLVMTableGen")
|
|
||||||
+ elseif("x${t}" STREQUAL "xSTATIC_LIBRARY")
|
|
||||||
+ list(APPEND FILTERED_LIB_NAMES ${lib})
|
|
||||||
+ endif()
|
|
||||||
+endforeach()
|
|
||||||
+set(LIB_NAMES ${FILTERED_LIB_NAMES})
|
|
||||||
+
|
|
||||||
if(LLVM_DYLIB_EXPORTED_SYMBOL_FILE)
|
|
||||||
set(LLVM_EXPORTED_SYMBOL_FILE ${LLVM_DYLIB_EXPORTED_SYMBOL_FILE})
|
|
||||||
add_custom_target(libLLVMExports DEPENDS ${LLVM_EXPORTED_SYMBOL_FILE})
|
|
||||||
@@ -39,7 +37,7 @@ endif()
|
|
||||||
add_llvm_library(LLVM SHARED DISABLE_LLVM_LINK_LLVM_DYLIB SONAME ${SOURCES})
|
|
||||||
|
|
||||||
list(REMOVE_DUPLICATES LIB_NAMES)
|
|
||||||
-if("${CMAKE_SYSTEM_NAME}" STREQUAL "Linux") # FIXME: It should be "GNU ld for elf"
|
|
||||||
+if("${CMAKE_SYSTEM_NAME}" STREQUAL "Linux" OR MINGW) # FIXME: It should be "GNU ld for elf"
|
|
||||||
# GNU ld doesn't resolve symbols in the version script.
|
|
||||||
set(LIB_NAMES -Wl,--whole-archive ${LIB_NAMES} -Wl,--no-whole-archive)
|
|
||||||
elseif("${CMAKE_SYSTEM_NAME}" STREQUAL "Darwin")
|
|
||||||
--
|
|
||||||
2.10.1
|
|
||||||
|
|
@ -1,392 +0,0 @@
|
|||||||
diff -up llvm-3.9.1.src/bindings/ocaml/backends/CMakeLists.txt.instdirs llvm-3.9.1.src/bindings/ocaml/backends/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/bindings/ocaml/backends/CMakeLists.txt.instdirs 2014-12-29 20:24:07.000000000 -0700
|
|
||||||
+++ llvm-3.9.1.src/bindings/ocaml/backends/CMakeLists.txt 2017-02-13 13:36:43.999154756 -0700
|
|
||||||
@@ -23,5 +23,5 @@ foreach(TARGET ${LLVM_TARGETS_TO_BUILD})
|
|
||||||
"${LLVM_LIBRARY_DIR}/ocaml/META.llvm_${TARGET}")
|
|
||||||
|
|
||||||
install(FILES "${LLVM_LIBRARY_DIR}/ocaml/META.llvm_${TARGET}"
|
|
||||||
- DESTINATION lib/ocaml)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_LIBDIR}/ocaml)
|
|
||||||
endforeach()
|
|
||||||
diff -up llvm-3.9.1.src/bindings/ocaml/llvm/CMakeLists.txt.instdirs llvm-3.9.1.src/bindings/ocaml/llvm/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/bindings/ocaml/llvm/CMakeLists.txt.instdirs 2014-12-29 20:24:07.000000000 -0700
|
|
||||||
+++ llvm-3.9.1.src/bindings/ocaml/llvm/CMakeLists.txt 2017-02-13 13:36:43.999154756 -0700
|
|
||||||
@@ -8,4 +8,4 @@ configure_file(
|
|
||||||
"${LLVM_LIBRARY_DIR}/ocaml/META.llvm")
|
|
||||||
|
|
||||||
install(FILES "${LLVM_LIBRARY_DIR}/ocaml/META.llvm"
|
|
||||||
- DESTINATION lib/ocaml)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_LIBDIR}/ocaml)
|
|
||||||
diff -up llvm-3.9.1.src/CMakeLists.txt.instdirs llvm-3.9.1.src/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/CMakeLists.txt.instdirs 2016-09-13 07:44:50.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/CMakeLists.txt 2017-02-13 13:36:44.003154733 -0700
|
|
||||||
@@ -194,13 +194,15 @@ if (CMAKE_BUILD_TYPE AND
|
|
||||||
endif()
|
|
||||||
|
|
||||||
set(LLVM_LIBDIR_SUFFIX "" CACHE STRING "Define suffix of library directory name (32/64)" )
|
|
||||||
-
|
|
||||||
-set(LLVM_TOOLS_INSTALL_DIR "bin" CACHE STRING "Path for binary subdirectory (defaults to 'bin')")
|
|
||||||
-mark_as_advanced(LLVM_TOOLS_INSTALL_DIR)
|
|
||||||
+set(CMAKE_INSTALL_BINDIR bin CACHE STRING "Path for binary subdirectory relative to prefix (defaults to 'bin')" )
|
|
||||||
+set(CMAKE_INSTALL_LIBDIR lib${LLVM_LIBDIR_SUFFIX} CACHE STRING "Path for library subdirectory (defaults to 'lib${LLVM_LIBDIR_SUFFIX}'" )
|
|
||||||
+set(CMAKE_INSTALL_INCLUDEDIR include CACHE STRING "Path for include subdirectory relative to prefix (defaults to 'include'" )
|
|
||||||
+set(CMAKE_INSTALL_DOCDIR share/doc/${project} CACHE STRING "Path for documentation subdirectory relative to prefix (defaults to 'share/doc/${project}')" )
|
|
||||||
+set(CMAKE_INSTALL_MANDIR share/man CACHE STRING "Path for manpages subdirectory relative to prefix (defaults to 'share/man')" )
|
|
||||||
|
|
||||||
# They are used as destination of target generators.
|
|
||||||
-set(LLVM_RUNTIME_OUTPUT_INTDIR ${CMAKE_CURRENT_BINARY_DIR}/${CMAKE_CFG_INTDIR}/bin)
|
|
||||||
-set(LLVM_LIBRARY_OUTPUT_INTDIR ${CMAKE_CURRENT_BINARY_DIR}/${CMAKE_CFG_INTDIR}/lib${LLVM_LIBDIR_SUFFIX})
|
|
||||||
+set(LLVM_RUNTIME_OUTPUT_INTDIR ${CMAKE_CURRENT_BINARY_DIR}/${CMAKE_CFG_INTDIR}/${CMAKE_INSTALL_BINDIR})
|
|
||||||
+set(LLVM_LIBRARY_OUTPUT_INTDIR ${CMAKE_CURRENT_BINARY_DIR}/${CMAKE_CFG_INTDIR}/${CMAKE_INSTALL_LIBDIR})
|
|
||||||
if(WIN32 OR CYGWIN)
|
|
||||||
# DLL platform -- put DLLs into bin.
|
|
||||||
set(LLVM_SHLIB_OUTPUT_INTDIR ${LLVM_RUNTIME_OUTPUT_INTDIR})
|
|
||||||
@@ -613,8 +615,8 @@ configure_file(
|
|
||||||
|
|
||||||
# They are not referenced. See set_output_directory().
|
|
||||||
set( CMAKE_RUNTIME_OUTPUT_DIRECTORY ${LLVM_BINARY_DIR}/bin )
|
|
||||||
-set( CMAKE_LIBRARY_OUTPUT_DIRECTORY ${LLVM_BINARY_DIR}/lib${LLVM_LIBDIR_SUFFIX} )
|
|
||||||
-set( CMAKE_ARCHIVE_OUTPUT_DIRECTORY ${LLVM_BINARY_DIR}/lib${LLVM_LIBDIR_SUFFIX} )
|
|
||||||
+set( CMAKE_LIBRARY_OUTPUT_DIRECTORY ${LLVM_BINARY_DIR}/${CMAKE_INSTALL_LIBDIR} )
|
|
||||||
+set( CMAKE_ARCHIVE_OUTPUT_DIRECTORY ${LLVM_BINARY_DIR}/${CMAKE_INSTALL_LIBDIR} )
|
|
||||||
|
|
||||||
set(CMAKE_BUILD_WITH_INSTALL_RPATH ON)
|
|
||||||
if (APPLE)
|
|
||||||
@@ -622,7 +624,7 @@ if (APPLE)
|
|
||||||
set(CMAKE_INSTALL_RPATH "@executable_path/../lib")
|
|
||||||
else(UNIX)
|
|
||||||
if(NOT DEFINED CMAKE_INSTALL_RPATH)
|
|
||||||
- set(CMAKE_INSTALL_RPATH "\$ORIGIN/../lib${LLVM_LIBDIR_SUFFIX}")
|
|
||||||
+ set(CMAKE_INSTALL_RPATH "\$ORIGIN/../${CMAKE_INSTALL_LIBDIR}")
|
|
||||||
if(${CMAKE_SYSTEM_NAME} MATCHES "(FreeBSD|DragonFly)")
|
|
||||||
set(CMAKE_EXE_LINKER_FLAGS "${CMAKE_EXE_LINKER_FLAGS} -Wl,-z,origin")
|
|
||||||
set(CMAKE_SHARED_LINKER_FLAGS "${CMAKE_SHARED_LINKER_FLAGS} -Wl,-z,origin")
|
|
||||||
@@ -799,7 +801,7 @@ add_subdirectory(cmake/modules)
|
|
||||||
|
|
||||||
if (NOT LLVM_INSTALL_TOOLCHAIN_ONLY)
|
|
||||||
install(DIRECTORY include/llvm include/llvm-c
|
|
||||||
- DESTINATION include
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_INCLUDEDIR}
|
|
||||||
COMPONENT llvm-headers
|
|
||||||
FILES_MATCHING
|
|
||||||
PATTERN "*.def"
|
|
||||||
@@ -811,7 +813,7 @@ if (NOT LLVM_INSTALL_TOOLCHAIN_ONLY)
|
|
||||||
)
|
|
||||||
|
|
||||||
install(DIRECTORY ${LLVM_INCLUDE_DIR}/llvm
|
|
||||||
- DESTINATION include
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_INCLUDEDIR}
|
|
||||||
COMPONENT llvm-headers
|
|
||||||
FILES_MATCHING
|
|
||||||
PATTERN "*.def"
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/AddLLVM.cmake.instdirs llvm-3.9.1.src/cmake/modules/AddLLVM.cmake
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/AddLLVM.cmake.instdirs 2016-07-09 20:43:47.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/AddLLVM.cmake 2017-02-13 13:36:44.012154680 -0700
|
|
||||||
@@ -546,7 +558,7 @@ macro(add_llvm_library name)
|
|
||||||
set_target_properties( ${name} PROPERTIES EXCLUDE_FROM_ALL ON)
|
|
||||||
elseif(NOT _is_gtest)
|
|
||||||
if (NOT LLVM_INSTALL_TOOLCHAIN_ONLY OR ${name} STREQUAL "LTO")
|
|
||||||
- set(install_dir lib${LLVM_LIBDIR_SUFFIX})
|
|
||||||
+ set(install_dir ${CMAKE_INSTALL_LIBDIR})
|
|
||||||
if(ARG_SHARED OR BUILD_SHARED_LIBS)
|
|
||||||
if(WIN32 OR CYGWIN OR MINGW)
|
|
||||||
set(install_type RUNTIME)
|
|
||||||
@@ -590,12 +602,12 @@ macro(add_llvm_loadable_module name)
|
|
||||||
# DLL platform
|
|
||||||
set(dlldir "bin")
|
|
||||||
else()
|
|
||||||
- set(dlldir "lib${LLVM_LIBDIR_SUFFIX}")
|
|
||||||
+ set(dlldir "${CMAKE_INSTALL_LIBDIR}")
|
|
||||||
endif()
|
|
||||||
install(TARGETS ${name}
|
|
||||||
EXPORT LLVMExports
|
|
||||||
LIBRARY DESTINATION ${dlldir}
|
|
||||||
- ARCHIVE DESTINATION lib${LLVM_LIBDIR_SUFFIX})
|
|
||||||
+ ARCHIVE DESTINATION ${CMAKE_INSTALL_LIBDIR})
|
|
||||||
endif()
|
|
||||||
set_property(GLOBAL APPEND PROPERTY LLVM_EXPORTS ${name})
|
|
||||||
endif()
|
|
||||||
@@ -770,7 +782,7 @@ macro(add_llvm_tool name)
|
|
||||||
if( LLVM_BUILD_TOOLS )
|
|
||||||
install(TARGETS ${name}
|
|
||||||
EXPORT LLVMExports
|
|
||||||
- RUNTIME DESTINATION ${LLVM_TOOLS_INSTALL_DIR}
|
|
||||||
+ RUNTIME DESTINATION ${CMAKE_INSTALL_BINDIR}
|
|
||||||
COMPONENT ${name})
|
|
||||||
|
|
||||||
if (NOT CMAKE_CONFIGURATION_TYPES)
|
|
||||||
@@ -795,7 +807,7 @@ macro(add_llvm_example name)
|
|
||||||
endif()
|
|
||||||
add_llvm_executable(${name} ${ARGN})
|
|
||||||
if( LLVM_BUILD_EXAMPLES )
|
|
||||||
- install(TARGETS ${name} RUNTIME DESTINATION examples)
|
|
||||||
+ install(TARGETS ${name} RUNTIME DESTINATION ${CMAKE_INSTALL_DOCDIR}/examples)
|
|
||||||
endif()
|
|
||||||
set_target_properties(${name} PROPERTIES FOLDER "Examples")
|
|
||||||
endmacro(add_llvm_example name)
|
|
||||||
@@ -811,7 +823,7 @@ macro(add_llvm_utility name)
|
|
||||||
set_target_properties(${name} PROPERTIES FOLDER "Utils")
|
|
||||||
if( LLVM_INSTALL_UTILS AND LLVM_BUILD_UTILS )
|
|
||||||
install (TARGETS ${name}
|
|
||||||
- RUNTIME DESTINATION bin
|
|
||||||
+ RUNTIME DESTINATION ${CMAKE_INSTALL_BINDIR}
|
|
||||||
COMPONENT ${name})
|
|
||||||
if (NOT CMAKE_CONFIGURATION_TYPES)
|
|
||||||
add_custom_target(install-${name}
|
|
||||||
@@ -1173,7 +1185,7 @@ function(llvm_install_library_symlink na
|
|
||||||
set(full_name ${CMAKE_${type}_LIBRARY_PREFIX}${name}${CMAKE_${type}_LIBRARY_SUFFIX})
|
|
||||||
set(full_dest ${CMAKE_${type}_LIBRARY_PREFIX}${dest}${CMAKE_${type}_LIBRARY_SUFFIX})
|
|
||||||
|
|
||||||
- set(output_dir lib${LLVM_LIBDIR_SUFFIX})
|
|
||||||
+ set(output_dir ${CMAKE_INSTALL_LIBDIR})
|
|
||||||
if(WIN32 AND "${type}" STREQUAL "SHARED")
|
|
||||||
set(output_dir bin)
|
|
||||||
endif()
|
|
||||||
@@ -1210,7 +1222,7 @@ function(llvm_install_symlink name dest)
|
|
||||||
set(full_dest ${dest}${CMAKE_EXECUTABLE_SUFFIX})
|
|
||||||
|
|
||||||
install(SCRIPT ${INSTALL_SYMLINK}
|
|
||||||
- CODE "install_symlink(${full_name} ${full_dest} ${LLVM_TOOLS_INSTALL_DIR})"
|
|
||||||
+ CODE "install_symlink(${full_name} ${full_dest} ${CMAKE_INSTALL_BINDIR})"
|
|
||||||
COMPONENT ${component})
|
|
||||||
|
|
||||||
if (NOT CMAKE_CONFIGURATION_TYPES AND NOT ARG_ALWAYS_GENERATE)
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/AddOCaml.cmake.instdirs llvm-3.9.1.src/cmake/modules/AddOCaml.cmake
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/AddOCaml.cmake.instdirs 2016-06-21 17:10:37.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/AddOCaml.cmake 2017-02-13 13:36:44.001154744 -0700
|
|
||||||
@@ -189,12 +189,12 @@ function(add_ocaml_library name)
|
|
||||||
endforeach()
|
|
||||||
|
|
||||||
install(FILES ${install_files}
|
|
||||||
- DESTINATION lib/ocaml)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_LIBDIR}/ocaml)
|
|
||||||
install(FILES ${install_shlibs}
|
|
||||||
PERMISSIONS OWNER_READ OWNER_WRITE OWNER_EXECUTE
|
|
||||||
GROUP_READ GROUP_EXECUTE
|
|
||||||
WORLD_READ WORLD_EXECUTE
|
|
||||||
- DESTINATION lib/ocaml)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_LIBDIR}/ocaml)
|
|
||||||
|
|
||||||
foreach( install_file ${install_files} ${install_shlibs} )
|
|
||||||
get_filename_component(filename "${install_file}" NAME)
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/AddSphinxTarget.cmake.instdirs llvm-3.9.1.src/cmake/modules/AddSphinxTarget.cmake
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/AddSphinxTarget.cmake.instdirs 2014-08-14 05:57:16.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/AddSphinxTarget.cmake 2017-02-13 13:36:44.001154744 -0700
|
|
||||||
@@ -50,11 +50,11 @@ function (add_sphinx_target builder proj
|
|
||||||
if (builder STREQUAL man)
|
|
||||||
# FIXME: We might not ship all the tools that these man pages describe
|
|
||||||
install(DIRECTORY "${SPHINX_BUILD_DIR}/" # Slash indicates contents of
|
|
||||||
- DESTINATION share/man/man1)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_MANDIR}/man1)
|
|
||||||
|
|
||||||
elseif (builder STREQUAL html)
|
|
||||||
install(DIRECTORY "${SPHINX_BUILD_DIR}"
|
|
||||||
- DESTINATION "share/doc/${project}")
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_DOCDIR})
|
|
||||||
else()
|
|
||||||
message(WARNING Installation of ${builder} not supported)
|
|
||||||
endif()
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/CMakeLists.txt.instdirs llvm-3.9.1.src/cmake/modules/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/CMakeLists.txt.instdirs 2017-02-13 13:36:43.995154779 -0700
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/CMakeLists.txt 2017-02-13 13:40:40.508732673 -0700
|
|
||||||
@@ -1,4 +1,4 @@
|
|
||||||
-set(LLVM_INSTALL_PACKAGE_DIR lib${LLVM_LIBDIR_SUFFIX}/cmake/llvm)
|
|
||||||
+set(LLVM_INSTALL_PACKAGE_DIR ${CMAKE_INSTALL_LIBDIR}/cmake/llvm CACHE STRING "Path for CMake subdirectory (defaults to 'cmake/llvm')")
|
|
||||||
set(llvm_cmake_builddir "${LLVM_BINARY_DIR}/${LLVM_INSTALL_PACKAGE_DIR}")
|
|
||||||
|
|
||||||
get_property(LLVM_EXPORTS GLOBAL PROPERTY LLVM_EXPORTS)
|
|
||||||
@@ -49,20 +49,12 @@ file(COPY .
|
|
||||||
|
|
||||||
# Generate LLVMConfig.cmake for the install tree.
|
|
||||||
set(LLVM_CONFIG_CODE "
|
|
||||||
-# Compute the installation prefix from this LLVMConfig.cmake file location.
|
|
||||||
-get_filename_component(LLVM_INSTALL_PREFIX \"\${CMAKE_CURRENT_LIST_FILE}\" PATH)")
|
|
||||||
-# Construct the proper number of get_filename_component(... PATH)
|
|
||||||
-# calls to compute the installation prefix.
|
|
||||||
-string(REGEX REPLACE "/" ";" _count "${LLVM_INSTALL_PACKAGE_DIR}")
|
|
||||||
-foreach(p ${_count})
|
|
||||||
- set(LLVM_CONFIG_CODE "${LLVM_CONFIG_CODE}
|
|
||||||
-get_filename_component(LLVM_INSTALL_PREFIX \"\${LLVM_INSTALL_PREFIX}\" PATH)")
|
|
||||||
-endforeach(p)
|
|
||||||
-set(LLVM_CONFIG_INCLUDE_DIRS "\${LLVM_INSTALL_PREFIX}/include")
|
|
||||||
-set(LLVM_CONFIG_LIBRARY_DIRS "\${LLVM_INSTALL_PREFIX}/lib\${LLVM_LIBDIR_SUFFIX}")
|
|
||||||
+set(LLVM_INSTALL_PREFIX \"${CMAKE_INSTALL_PREFIX}\")")
|
|
||||||
+set(LLVM_CONFIG_INCLUDE_DIRS "\${LLVM_INSTALL_PREFIX}/${CMAKE_INSTALL_INCLUDEDIR}")
|
|
||||||
+set(LLVM_CONFIG_LIBRARY_DIRS "\${LLVM_INSTALL_PREFIX}/${CMAKE_INSTALL_LIBDIR}")
|
|
||||||
set(LLVM_CONFIG_CMAKE_DIR "\${LLVM_INSTALL_PREFIX}/${LLVM_INSTALL_PACKAGE_DIR}")
|
|
||||||
set(LLVM_CONFIG_BINARY_DIR "\${LLVM_INSTALL_PREFIX}")
|
|
||||||
-set(LLVM_CONFIG_TOOLS_BINARY_DIR "\${LLVM_INSTALL_PREFIX}/bin")
|
|
||||||
+set(LLVM_CONFIG_TOOLS_BINARY_DIR "\${LLVM_INSTALL_PREFIX}/${CMAKE_INSTALL_BINDIR}")
|
|
||||||
set(LLVM_CONFIG_EXPORTS_FILE "\${LLVM_CMAKE_DIR}/LLVMExports.cmake")
|
|
||||||
configure_file(
|
|
||||||
LLVMConfig.cmake.in
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/LLVMConfig.cmake.in.instdirs llvm-3.9.1.src/cmake/modules/LLVMConfig.cmake.in
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/LLVMConfig.cmake.in.instdirs 2016-07-01 08:22:52.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/LLVMConfig.cmake.in 2017-02-13 13:36:44.002154738 -0700
|
|
||||||
@@ -59,7 +59,7 @@ set(LLVM_DEFINITIONS "@LLVM_DEFINITIONS@
|
|
||||||
set(LLVM_CMAKE_DIR "@LLVM_CONFIG_CMAKE_DIR@")
|
|
||||||
set(LLVM_BINARY_DIR "@LLVM_CONFIG_BINARY_DIR@")
|
|
||||||
set(LLVM_TOOLS_BINARY_DIR "@LLVM_CONFIG_TOOLS_BINARY_DIR@")
|
|
||||||
-set(LLVM_TOOLS_INSTALL_DIR "@LLVM_TOOLS_INSTALL_DIR@")
|
|
||||||
+set(LLVM_TOOLS_INSTALL_DIR "@CMAKE_INSTALL_BINDIR@")
|
|
||||||
|
|
||||||
if(NOT TARGET LLVMSupport)
|
|
||||||
set(LLVM_EXPORTED_TARGETS "@LLVM_EXPORTS@")
|
|
||||||
diff -up llvm-3.9.1.src/cmake/modules/TableGen.cmake.instdirs llvm-3.9.1.src/cmake/modules/TableGen.cmake
|
|
||||||
--- llvm-3.9.1.src/cmake/modules/TableGen.cmake.instdirs 2016-06-08 15:19:26.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/cmake/modules/TableGen.cmake 2017-02-13 13:47:59.832154520 -0700
|
|
||||||
@@ -6,7 +6,6 @@ function(tablegen project ofn)
|
|
||||||
# Validate calling context.
|
|
||||||
foreach(v
|
|
||||||
${project}_TABLEGEN_EXE
|
|
||||||
- LLVM_MAIN_SRC_DIR
|
|
||||||
LLVM_MAIN_INCLUDE_DIR
|
|
||||||
)
|
|
||||||
if(NOT ${v})
|
|
||||||
@@ -23,10 +22,14 @@ function(tablegen project ofn)
|
|
||||||
set(LLVM_TARGET_DEFINITIONS_ABSOLUTE
|
|
||||||
${CMAKE_CURRENT_SOURCE_DIR}/${LLVM_TARGET_DEFINITIONS})
|
|
||||||
endif()
|
|
||||||
+ if (LLVM_MAIN_SRC_DIR)
|
|
||||||
+ set(TABLEGEN_INCLUDES -I ${LLVM_MAIN_SRC_DIR}/lib/Target)
|
|
||||||
+ endif()
|
|
||||||
+ set(TABLEGEN_INCLUDES ${TABLEGEN_INCLUDES} -I ${LLVM_MAIN_INCLUDE_DIR})
|
|
||||||
add_custom_command(OUTPUT ${CMAKE_CURRENT_BINARY_DIR}/${ofn}.tmp
|
|
||||||
# Generate tablegen output in a temporary file.
|
|
||||||
COMMAND ${${project}_TABLEGEN_EXE} ${ARGN} -I ${CMAKE_CURRENT_SOURCE_DIR}
|
|
||||||
- -I ${LLVM_MAIN_SRC_DIR}/lib/Target -I ${LLVM_MAIN_INCLUDE_DIR}
|
|
||||||
+ ${TABLEGEN_INCLUDES}
|
|
||||||
${LLVM_TARGET_DEFINITIONS_ABSOLUTE}
|
|
||||||
-o ${CMAKE_CURRENT_BINARY_DIR}/${ofn}.tmp
|
|
||||||
# The file in LLVM_TARGET_DEFINITIONS may be not in the current
|
|
||||||
@@ -141,7 +144,7 @@ macro(add_tablegen target project)
|
|
||||||
if (${project} STREQUAL LLVM AND NOT LLVM_INSTALL_TOOLCHAIN_ONLY)
|
|
||||||
install(TARGETS ${target}
|
|
||||||
EXPORT LLVMExports
|
|
||||||
- RUNTIME DESTINATION ${LLVM_TOOLS_INSTALL_DIR})
|
|
||||||
+ RUNTIME DESTINATION ${CMAKE_INSTALL_BINDIR})
|
|
||||||
endif()
|
|
||||||
set_property(GLOBAL APPEND PROPERTY LLVM_EXPORTS ${target})
|
|
||||||
endmacro()
|
|
||||||
diff -up llvm-3.9.1.src/docs/CMakeLists.txt.instdirs llvm-3.9.1.src/docs/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/docs/CMakeLists.txt.instdirs 2015-08-17 17:24:17.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/docs/CMakeLists.txt 2017-02-13 13:36:44.004154727 -0700
|
|
||||||
@@ -94,7 +94,7 @@ if (LLVM_ENABLE_DOXYGEN)
|
|
||||||
|
|
||||||
if (NOT LLVM_INSTALL_TOOLCHAIN_ONLY)
|
|
||||||
install(DIRECTORY ${CMAKE_CURRENT_BINARY_DIR}/doxygen/html
|
|
||||||
- DESTINATION docs/html)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_DOCDIR}/html)
|
|
||||||
endif()
|
|
||||||
endif()
|
|
||||||
endif()
|
|
||||||
@@ -155,6 +155,6 @@ if( NOT uses_ocaml LESS 0 )
|
|
||||||
|
|
||||||
if (NOT LLVM_INSTALL_TOOLCHAIN_ONLY)
|
|
||||||
install(DIRECTORY ${CMAKE_CURRENT_BINARY_DIR}/ocamldoc/html
|
|
||||||
- DESTINATION docs/ocaml/html)
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_DOCDIR}/ocaml/html)
|
|
||||||
endif()
|
|
||||||
endif()
|
|
||||||
diff -up llvm-3.9.1.src/include/llvm/CMakeLists.txt.instdirs llvm-3.9.1.src/include/llvm/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/include/llvm/CMakeLists.txt.instdirs 2014-08-13 18:51:47.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/include/llvm/CMakeLists.txt 2017-02-13 13:36:44.004154727 -0700
|
|
||||||
@@ -3,5 +3,5 @@ add_subdirectory(IR)
|
|
||||||
# If we're doing an out-of-tree build, copy a module map for generated
|
|
||||||
# header files into the build area.
|
|
||||||
if (NOT "${CMAKE_SOURCE_DIR}" STREQUAL "${CMAKE_BINARY_DIR}")
|
|
||||||
- configure_file(module.modulemap.build module.modulemap COPYONLY)
|
|
||||||
+ configure_file(module.modulemap.build ${LLVM_INCLUDE_DIR}/module.modulemap COPYONLY)
|
|
||||||
endif (NOT "${CMAKE_SOURCE_DIR}" STREQUAL "${CMAKE_BINARY_DIR}")
|
|
||||||
diff -up llvm-3.9.1.src/tools/llvm-config/BuildVariables.inc.in.instdirs llvm-3.9.1.src/tools/llvm-config/BuildVariables.inc.in
|
|
||||||
--- llvm-3.9.1.src/tools/llvm-config/BuildVariables.inc.in.instdirs 2016-03-07 17:02:50.000000000 -0700
|
|
||||||
+++ llvm-3.9.1.src/tools/llvm-config/BuildVariables.inc.in 2017-02-13 13:36:44.005154721 -0700
|
|
||||||
@@ -23,7 +23,9 @@
|
|
||||||
#define LLVM_LDFLAGS "@LLVM_LDFLAGS@"
|
|
||||||
#define LLVM_CXXFLAGS "@LLVM_CXXFLAGS@"
|
|
||||||
#define LLVM_BUILDMODE "@LLVM_BUILDMODE@"
|
|
||||||
-#define LLVM_LIBDIR_SUFFIX "@LLVM_LIBDIR_SUFFIX@"
|
|
||||||
+#define LLVM_BINARY_DIR "@CMAKE_INSTALL_BINDIR@"
|
|
||||||
+#define LLVM_LIBRARY_DIR "@CMAKE_INSTALL_LIBDIR@"
|
|
||||||
+#define LLVM_INCLUDE_DIR "@CMAKE_INSTALL_INCLUDEDIR@"
|
|
||||||
#define LLVM_TARGETS_BUILT "@LLVM_TARGETS_BUILT@"
|
|
||||||
#define LLVM_SYSTEM_LIBS "@LLVM_SYSTEM_LIBS@"
|
|
||||||
#define LLVM_BUILD_SYSTEM "@LLVM_BUILD_SYSTEM@"
|
|
||||||
diff -up llvm-3.9.1.src/tools/llvm-config/llvm-config.cpp.instdirs llvm-3.9.1.src/tools/llvm-config/llvm-config.cpp
|
|
||||||
--- llvm-3.9.1.src/tools/llvm-config/llvm-config.cpp.instdirs 2016-03-14 15:39:58.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/tools/llvm-config/llvm-config.cpp 2017-02-13 13:36:44.006154715 -0700
|
|
||||||
@@ -290,7 +290,7 @@ int main(int argc, char **argv) {
|
|
||||||
DevelopmentTreeLayout = CMakeStyle;
|
|
||||||
ActiveObjRoot = LLVM_OBJ_ROOT;
|
|
||||||
} else if (sys::fs::equivalent(CurrentExecPrefix,
|
|
||||||
- Twine(LLVM_OBJ_ROOT) + "/bin")) {
|
|
||||||
+ Twine(LLVM_OBJ_ROOT) + "/" + LLVM_BINARY_DIR)) {
|
|
||||||
IsInDevelopmentTree = true;
|
|
||||||
DevelopmentTreeLayout = CMakeBuildModeStyle;
|
|
||||||
ActiveObjRoot = LLVM_OBJ_ROOT;
|
|
||||||
@@ -304,32 +304,32 @@ int main(int argc, char **argv) {
|
|
||||||
std::string ActivePrefix, ActiveBinDir, ActiveIncludeDir, ActiveLibDir;
|
|
||||||
std::string ActiveIncludeOption;
|
|
||||||
if (IsInDevelopmentTree) {
|
|
||||||
- ActiveIncludeDir = std::string(LLVM_SRC_ROOT) + "/include";
|
|
||||||
+ ActiveIncludeDir = std::string(LLVM_SRC_ROOT) + "/" + LLVM_INCLUDE_DIR;
|
|
||||||
ActivePrefix = CurrentExecPrefix;
|
|
||||||
|
|
||||||
// CMake organizes the products differently than a normal prefix style
|
|
||||||
// layout.
|
|
||||||
switch (DevelopmentTreeLayout) {
|
|
||||||
case CMakeStyle:
|
|
||||||
- ActiveBinDir = ActiveObjRoot + "/bin";
|
|
||||||
- ActiveLibDir = ActiveObjRoot + "/lib" + LLVM_LIBDIR_SUFFIX;
|
|
||||||
+ ActiveBinDir = ActiveObjRoot + "/" + LLVM_BINARY_DIR;
|
|
||||||
+ ActiveLibDir = ActiveObjRoot + LLVM_LIBRARY_DIR;
|
|
||||||
break;
|
|
||||||
case CMakeBuildModeStyle:
|
|
||||||
ActivePrefix = ActiveObjRoot;
|
|
||||||
- ActiveBinDir = ActiveObjRoot + "/bin/" + build_mode;
|
|
||||||
+ ActiveBinDir = ActiveObjRoot + "/" + LLVM_BINARY_DIR + "/" + build_mode;
|
|
||||||
ActiveLibDir =
|
|
||||||
- ActiveObjRoot + "/lib" + LLVM_LIBDIR_SUFFIX + "/" + build_mode;
|
|
||||||
+ ActiveObjRoot + "/" + LLVM_LIBRARY_DIR + "/" + build_mode;
|
|
||||||
break;
|
|
||||||
}
|
|
||||||
|
|
||||||
// We need to include files from both the source and object trees.
|
|
||||||
ActiveIncludeOption =
|
|
||||||
- ("-I" + ActiveIncludeDir + " " + "-I" + ActiveObjRoot + "/include");
|
|
||||||
+ ("-I" + ActiveIncludeDir + " " + "-I" + ActiveObjRoot + "/" + LLVM_INCLUDE_DIR);
|
|
||||||
} else {
|
|
||||||
ActivePrefix = CurrentExecPrefix;
|
|
||||||
- ActiveIncludeDir = ActivePrefix + "/include";
|
|
||||||
- ActiveBinDir = ActivePrefix + "/bin";
|
|
||||||
- ActiveLibDir = ActivePrefix + "/lib" + LLVM_LIBDIR_SUFFIX;
|
|
||||||
+ ActiveIncludeDir = ActivePrefix + "/" + LLVM_INCLUDE_DIR;
|
|
||||||
+ ActiveBinDir = ActivePrefix + "/" + LLVM_BINARY_DIR;
|
|
||||||
+ ActiveLibDir = ActivePrefix + "/" + LLVM_LIBRARY_DIR;
|
|
||||||
ActiveIncludeOption = "-I" + ActiveIncludeDir;
|
|
||||||
}
|
|
||||||
|
|
||||||
diff -up llvm-3.9.1.src/tools/llvm-shlib/CMakeLists.txt.instdirs llvm-3.9.1.src/tools/llvm-shlib/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/tools/llvm-shlib/CMakeLists.txt.instdirs 2016-05-25 22:35:35.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/tools/llvm-shlib/CMakeLists.txt 2017-02-13 13:36:44.065154372 -0700
|
|
||||||
@@ -68,7 +66,7 @@ if(LLVM_BUILD_LLVM_C_DYLIB)
|
|
||||||
|
|
||||||
set(LLVM_EXPORTED_SYMBOL_FILE ${CMAKE_BINARY_DIR}/libllvm-c.exports)
|
|
||||||
|
|
||||||
- set(LIB_DIR ${CMAKE_BINARY_DIR}/${CMAKE_CFG_INTDIR}/lib${LLVM_LIBDIR_SUFFIX})
|
|
||||||
+ set(LIB_DIR ${CMAKE_BINARY_DIR}/${CMAKE_CFG_INTDIR}/${CMAKE_INSTALL_LIBDIR})
|
|
||||||
set(LIB_NAME ${LIB_DIR}/${CMAKE_SHARED_LIBRARY_PREFIX}LLVM)
|
|
||||||
set(LIB_PATH ${LIB_NAME}${CMAKE_SHARED_LIBRARY_SUFFIX})
|
|
||||||
set(LIB_EXPORTS_PATH ${LIB_NAME}.exports)
|
|
||||||
diff -up llvm-3.9.1.src/tools/lto/CMakeLists.txt.instdirs llvm-3.9.1.src/tools/lto/CMakeLists.txt
|
|
||||||
--- llvm-3.9.1.src/tools/lto/CMakeLists.txt.instdirs 2016-07-11 21:01:22.000000000 -0600
|
|
||||||
+++ llvm-3.9.1.src/tools/lto/CMakeLists.txt 2017-02-13 13:36:44.007154709 -0700
|
|
||||||
@@ -19,7 +19,7 @@ set(LLVM_EXPORTED_SYMBOL_FILE ${CMAKE_CU
|
|
||||||
add_llvm_library(LTO SHARED ${SOURCES})
|
|
||||||
|
|
||||||
install(FILES ${LLVM_MAIN_INCLUDE_DIR}/llvm-c/lto.h
|
|
||||||
- DESTINATION include/llvm-c
|
|
||||||
+ DESTINATION ${CMAKE_INSTALL_INCLUDEDIR}/llvm-c
|
|
||||||
COMPONENT LTO)
|
|
||||||
|
|
||||||
if (APPLE)
|
|
48
abi-check.sh
Executable file
48
abi-check.sh
Executable file
@ -0,0 +1,48 @@
|
|||||||
|
#!/bin/sh
|
||||||
|
|
||||||
|
[ $# -ne 2 ] && echo "Usage: $(basename $0) ver-rel1 ver-rel2" && exit 1
|
||||||
|
|
||||||
|
if [ "$1" = "$2" ]; then
|
||||||
|
echo "ver-rel's must be different!"
|
||||||
|
exit 1
|
||||||
|
fi
|
||||||
|
|
||||||
|
#set -x
|
||||||
|
|
||||||
|
mkdir -p koji
|
||||||
|
cd koji
|
||||||
|
|
||||||
|
for i in $1 $2; do
|
||||||
|
if [ ! -d "$i" ]; then
|
||||||
|
mkdir -p $i/{x86_64,i686,armv7hl}
|
||||||
|
cd $i
|
||||||
|
for a in x86_64 i686 armv7hl; do
|
||||||
|
cd $a
|
||||||
|
koji download-build --arch=$a ghc-$i
|
||||||
|
cd ..
|
||||||
|
done
|
||||||
|
cd ..
|
||||||
|
fi
|
||||||
|
done
|
||||||
|
|
||||||
|
for a in x86_64 i686 armv7hl; do
|
||||||
|
echo "= $a ="
|
||||||
|
for i in $1/$a/*; do
|
||||||
|
PKGVER=$(rpm -qp --qf "%{name}-%{version}" $i)
|
||||||
|
PKG2=$(ls $2/$a/$PKGVER*.$a.rpm)
|
||||||
|
PROV1=$(rpm -qp --provides $i | grep ^ghc\( | grep -v =)
|
||||||
|
PROV2=$(rpm -qp --provides $PKG2 | grep ^ghc\( | grep -v =)
|
||||||
|
# if [ -n "$PROV1" ]; then
|
||||||
|
# echo $PROV1
|
||||||
|
# else
|
||||||
|
# echo "no provides for $i"
|
||||||
|
# fi
|
||||||
|
if [ -n "$PROV2" ]; then
|
||||||
|
if [ "$PROV1" != "$PROV2" ]; then
|
||||||
|
echo $PROV2
|
||||||
|
fi
|
||||||
|
# else
|
||||||
|
# echo "no provides for $PKG2"
|
||||||
|
fi
|
||||||
|
done
|
||||||
|
done
|
23
buildpath-abi-stability.patch
Normal file
23
buildpath-abi-stability.patch
Normal file
@ -0,0 +1,23 @@
|
|||||||
|
Forwarded to https://ghc.haskell.org/trac/ghc/ticket/10424
|
||||||
|
|
||||||
|
--- a/compiler/iface/MkIface.hs
|
||||||
|
+++ b/compiler/iface/MkIface.hs
|
||||||
|
@@ -681,7 +681,7 @@ addFingerprints hsc_env mb_old_fingerpri
|
||||||
|
iface_hash <- computeFingerprint putNameLiterally
|
||||||
|
(mod_hash,
|
||||||
|
ann_fn (mkVarOcc "module"), -- See mkIfaceAnnCache
|
||||||
|
- mi_usages iface0,
|
||||||
|
+ usages,
|
||||||
|
sorted_deps,
|
||||||
|
mi_hpc iface0)
|
||||||
|
|
||||||
|
@@ -714,6 +714,9 @@ addFingerprints hsc_env mb_old_fingerpri
|
||||||
|
(non_orph_fis, orph_fis) = mkOrphMap ifFamInstOrph (mi_fam_insts iface0)
|
||||||
|
fix_fn = mi_fix_fn iface0
|
||||||
|
ann_fn = mkIfaceAnnCache (mi_anns iface0)
|
||||||
|
+ -- Do not allow filenames to affect the interface
|
||||||
|
+ usages = [ case u of UsageFile _ fp -> UsageFile "" fp; _ -> u | u <- mi_usages iface0 ]
|
||||||
|
+
|
||||||
|
|
||||||
|
-- | Retrieve the orphan hashes 'mi_orphan_hash' for a list of modules
|
||||||
|
-- (in particular, the orphan modules which are transitively imported by the
|
31
fix-build-using-unregisterised-v8.6.patch
Normal file
31
fix-build-using-unregisterised-v8.6.patch
Normal file
@ -0,0 +1,31 @@
|
|||||||
|
Description: Allow unregisterised ghc-8.6 to build newer GHC
|
||||||
|
Commit af9b744bbf1 introduced a regression stopping existing unregisterised
|
||||||
|
compilers from being able to compile newer versions of GHC. The problem is
|
||||||
|
that the bootstrap compiler uses the newer `includes/stg/MiscClosures.h` file
|
||||||
|
where some defines have been renamed, resulting in the following error:
|
||||||
|
.
|
||||||
|
error: ‘stg_atomicModifyMutVarzh’ undeclared (first use in this function); did you mean ‘stg_atomicModifyMutVar2zh’?
|
||||||
|
.
|
||||||
|
For more information, see https://gitlab.haskell.org/ghc/ghc/issues/17111.
|
||||||
|
.
|
||||||
|
This patch can be removed, once ghc-8.6 is no longer the bootstrap compiler.
|
||||||
|
Author: Ilias Tsitsimpis <iliastsi@debian.org>
|
||||||
|
Bug: https://gitlab.haskell.org/ghc/ghc/issues/17111
|
||||||
|
|
||||||
|
Index: b/includes/stg/MiscClosures.h
|
||||||
|
===================================================================
|
||||||
|
--- a/includes/stg/MiscClosures.h
|
||||||
|
+++ b/includes/stg/MiscClosures.h
|
||||||
|
@@ -390,8 +390,12 @@ RTS_FUN_DECL(stg_copySmallMutableArrayzh
|
||||||
|
RTS_FUN_DECL(stg_casSmallArrayzh);
|
||||||
|
|
||||||
|
RTS_FUN_DECL(stg_newMutVarzh);
|
||||||
|
+#if __GLASGOW_HASKELL__ < 808
|
||||||
|
+RTS_FUN_DECL(stg_atomicModifyMutVarzh);
|
||||||
|
+#else
|
||||||
|
RTS_FUN_DECL(stg_atomicModifyMutVar2zh);
|
||||||
|
RTS_FUN_DECL(stg_atomicModifyMutVarzuzh);
|
||||||
|
+#endif
|
||||||
|
RTS_FUN_DECL(stg_casMutVarzh);
|
||||||
|
|
||||||
|
RTS_FUN_DECL(stg_isEmptyMVarzh);
|
51
fix-build-using-unregisterized-v8.2.patch
Normal file
51
fix-build-using-unregisterized-v8.2.patch
Normal file
@ -0,0 +1,51 @@
|
|||||||
|
Description: Allow unregisterised ghc-8.2 to build newer GHC
|
||||||
|
Commit b68697e579d38ca29c2b84377dc2affa04659a28 introduced a regression
|
||||||
|
stopping existing unregisteristed compilers from being used to compile a newer
|
||||||
|
version of GHC. The problem is that the bootstrap compiler uses the newer Stg.h
|
||||||
|
where EB_, IB_, etc, definitions have changed resulting in the following error:
|
||||||
|
.
|
||||||
|
error: conflicting types for 'ghc_GhcPrelude_zdtrModule4_bytes'
|
||||||
|
note: in definition of macro 'EB_'
|
||||||
|
#define EB_(X) extern const char X[]
|
||||||
|
note: previous definition of 'ghc_GhcPrelude_zdtrModule4_bytes' was here
|
||||||
|
char ghc_GhcPrelude_zdtrModule4_bytes[] = "ghc";
|
||||||
|
.
|
||||||
|
For more information about the problem, see https://phabricator.haskell.org/D4114.
|
||||||
|
.
|
||||||
|
This patch is a rework of https://phabricator.haskell.org/D3741.
|
||||||
|
It modifies Stg.h to include the old definitions, if a compiler older than
|
||||||
|
8.4 is being used.
|
||||||
|
.
|
||||||
|
This patch can be removed, once ghc-8.2 is no longer the bootstrap compiler.
|
||||||
|
Author: Ilias Tsitsimpis <iliastsi@debian.org>
|
||||||
|
Bug: https://ghc.haskell.org/trac/ghc/ticket/15201
|
||||||
|
|
||||||
|
Index: b/includes/Stg.h
|
||||||
|
===================================================================
|
||||||
|
--- a/includes/Stg.h
|
||||||
|
+++ b/includes/Stg.h
|
||||||
|
@@ -232,6 +232,16 @@ typedef StgInt I_;
|
||||||
|
typedef StgWord StgWordArray[];
|
||||||
|
typedef StgFunPtr F_;
|
||||||
|
|
||||||
|
+#if __GLASGOW_HASKELL__ < 804
|
||||||
|
+#define EB_(X) extern char X[]
|
||||||
|
+#define IB_(X) static char X[]
|
||||||
|
+#define EI_(X) extern StgWordArray (X) GNU_ATTRIBUTE(aligned (8))
|
||||||
|
+#define II_(X) static StgWordArray (X) GNU_ATTRIBUTE(aligned (8))
|
||||||
|
+#define IF_(f) static StgFunPtr GNUC3_ATTRIBUTE(used) f(void)
|
||||||
|
+#define FN_(f) StgFunPtr f(void)
|
||||||
|
+#define EF_(f) StgFunPtr f(void) /* External Cmm functions */
|
||||||
|
+#define EFF_(f) void f() /* See Note [External function prototypes] */
|
||||||
|
+#else
|
||||||
|
/* byte arrays (and strings): */
|
||||||
|
#define EB_(X) extern const char X[]
|
||||||
|
#define IB_(X) static const char X[]
|
||||||
|
@@ -250,6 +260,7 @@ typedef StgFunPtr F_;
|
||||||
|
#define EF_(f) StgFunPtr f(void) /* External Cmm functions */
|
||||||
|
/* foreign functions: */
|
||||||
|
#define EFF_(f) void f() /* See Note [External function prototypes] */
|
||||||
|
+#endif /* __GLASGOW_HASKELL__ < 804 */
|
||||||
|
|
||||||
|
/* Note [External function prototypes] See Trac #8965, #11395
|
||||||
|
~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~~
|
58
fix-build-using-unregisterized-v8.4.patch
Normal file
58
fix-build-using-unregisterized-v8.4.patch
Normal file
@ -0,0 +1,58 @@
|
|||||||
|
Description: Allow unregisterised ghc-8.4 to build newer GHC
|
||||||
|
Commit 4075656e8bb introduced a regression stopping existing unregisteristed
|
||||||
|
compilers from being able to compile newer versions of GHC. The problem is
|
||||||
|
that the bootstrap compiler uses the newer `rts/storage/ClosureTypes.h` file
|
||||||
|
where some defines have been renamed, resulting in the following error:
|
||||||
|
.
|
||||||
|
error: ‘stg_MUT_ARR_PTRS_FROZEN0_info’ undeclared (first use in this function); did you mean ‘stg_MUT_ARR_PTRS_FROZEN_DIRTY_info’?
|
||||||
|
.
|
||||||
|
For more information, see https://gitlab.haskell.org/ghc/ghc/issues/15913.
|
||||||
|
.
|
||||||
|
This patch can be removed, once ghc-8.4 is no longer the bootstrap compiler.
|
||||||
|
Author: Ilias Tsitsimpis <iliastsi@debian.org>
|
||||||
|
Bug: https://gitlab.haskell.org/ghc/ghc/issues/15913
|
||||||
|
Bug-Debian: https://bugs.debian.org/932941
|
||||||
|
|
||||||
|
Index: b/includes/rts/storage/ClosureTypes.h
|
||||||
|
===================================================================
|
||||||
|
--- a/includes/rts/storage/ClosureTypes.h
|
||||||
|
+++ b/includes/rts/storage/ClosureTypes.h
|
||||||
|
@@ -82,5 +82,11 @@
|
||||||
|
#define SMALL_MUT_ARR_PTRS_DIRTY 60
|
||||||
|
#define SMALL_MUT_ARR_PTRS_FROZEN_DIRTY 61
|
||||||
|
#define SMALL_MUT_ARR_PTRS_FROZEN_CLEAN 62
|
||||||
|
+#if __GLASGOW_HASKELL__ < 806
|
||||||
|
+#define SMALL_MUT_ARR_PTRS_FROZEN0 SMALL_MUT_ARR_PTRS_FROZEN_DIRTY
|
||||||
|
+#define SMALL_MUT_ARR_PTRS_FROZEN SMALL_MUT_ARR_PTRS_FROZEN_CLEAN
|
||||||
|
+#define MUT_ARR_PTRS_FROZEN0 MUT_ARR_PTRS_FROZEN_DIRTY
|
||||||
|
+#define MUT_ARR_PTRS_FROZEN MUT_ARR_PTRS_FROZEN_CLEAN
|
||||||
|
+#endif
|
||||||
|
#define COMPACT_NFDATA 63
|
||||||
|
#define N_CLOSURE_TYPES 64
|
||||||
|
Index: b/includes/stg/MiscClosures.h
|
||||||
|
===================================================================
|
||||||
|
--- a/includes/stg/MiscClosures.h
|
||||||
|
+++ b/includes/stg/MiscClosures.h
|
||||||
|
@@ -116,12 +116,22 @@ RTS_ENTRY(stg_ARR_WORDS);
|
||||||
|
RTS_ENTRY(stg_MUT_ARR_WORDS);
|
||||||
|
RTS_ENTRY(stg_MUT_ARR_PTRS_CLEAN);
|
||||||
|
RTS_ENTRY(stg_MUT_ARR_PTRS_DIRTY);
|
||||||
|
+#if __GLASGOW_HASKELL__ < 806
|
||||||
|
+RTS_ENTRY(stg_MUT_ARR_PTRS_FROZEN);
|
||||||
|
+RTS_ENTRY(stg_MUT_ARR_PTRS_FROZEN0);
|
||||||
|
+#else
|
||||||
|
RTS_ENTRY(stg_MUT_ARR_PTRS_FROZEN_CLEAN);
|
||||||
|
RTS_ENTRY(stg_MUT_ARR_PTRS_FROZEN_DIRTY);
|
||||||
|
+#endif
|
||||||
|
RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_CLEAN);
|
||||||
|
RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_DIRTY);
|
||||||
|
+#if __GLASGOW_HASKELL__ < 806
|
||||||
|
+RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_FROZEN);
|
||||||
|
+RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_FROZEN0);
|
||||||
|
+#else
|
||||||
|
RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_FROZEN_CLEAN);
|
||||||
|
RTS_ENTRY(stg_SMALL_MUT_ARR_PTRS_FROZEN_DIRTY);
|
||||||
|
+#endif
|
||||||
|
RTS_ENTRY(stg_MUT_VAR_CLEAN);
|
||||||
|
RTS_ENTRY(stg_MUT_VAR_DIRTY);
|
||||||
|
RTS_ENTRY(stg_END_TSO_QUEUE);
|
35
ghc-8.6.3-sphinx-1.8.patch
Normal file
35
ghc-8.6.3-sphinx-1.8.patch
Normal file
@ -0,0 +1,35 @@
|
|||||||
|
--- ghc-8.6.3/docs/users_guide/flags.py~ 2018-09-21 06:18:23.000000000 +0800
|
||||||
|
+++ ghc-8.6.3/docs/users_guide/flags.py 2019-03-05 10:20:38.639782096 +0800
|
||||||
|
@@ -49,6 +49,8 @@
|
||||||
|
import sphinx
|
||||||
|
from sphinx import addnodes
|
||||||
|
from sphinx.domains.std import GenericObject
|
||||||
|
+from sphinx.domains import ObjType
|
||||||
|
+from sphinx.roles import XRefRole
|
||||||
|
from sphinx.errors import SphinxError
|
||||||
|
from distutils.version import LooseVersion
|
||||||
|
from utils import build_table_from_list
|
||||||
|
@@ -603,14 +605,21 @@
|
||||||
|
sphinx_version = LooseVersion(sphinx.__version__)
|
||||||
|
override_arg = {'override': True} if sphinx_version >= LooseVersion('1.8') else {}
|
||||||
|
|
||||||
|
+ # Yuck: We can't use app.add_object_type since we need to provide the
|
||||||
|
+ # Directive instance ourselves.
|
||||||
|
+ std_object_types = app.registry.domain_object_types.setdefault('std', {})
|
||||||
|
+
|
||||||
|
# Add ghc-flag directive, and override the class with our own
|
||||||
|
- app.add_object_type('ghc-flag', 'ghc-flag')
|
||||||
|
app.add_directive_to_domain('std', 'ghc-flag', Flag, **override_arg)
|
||||||
|
+ app.add_role_to_domain('std', 'ghc-flag', XRefRole())
|
||||||
|
+ std_object_types['ghc-flag'] = ObjType('ghc-flag', 'ghc-flag')
|
||||||
|
|
||||||
|
# Add extension directive, and override the class with our own
|
||||||
|
- app.add_object_type('extension', 'extension')
|
||||||
|
app.add_directive_to_domain('std', 'extension', LanguageExtension,
|
||||||
|
**override_arg)
|
||||||
|
+ app.add_role_to_domain('std', 'extension', XRefRole())
|
||||||
|
+ std_object_types['extension'] = ObjType('ghc-flag', 'ghc-flag')
|
||||||
|
+
|
||||||
|
# NB: language-extension would be misinterpreted by sphinx, and produce
|
||||||
|
# lang="extensions" XML attributes
|
||||||
|
|
12
ghc-Cabal-install-PATH-warning.patch
Normal file
12
ghc-Cabal-install-PATH-warning.patch
Normal file
@ -0,0 +1,12 @@
|
|||||||
|
--- ghc-8.2.2/libraries/Cabal/Cabal/Distribution/Simple/Install.hs~ 2017-05-05 23:51:43.000000000 +0900
|
||||||
|
+++ ghc-8.2.2/libraries/Cabal/Cabal/Distribution/Simple/Install.hs 2018-02-27 12:22:13.159432104 +0900
|
||||||
|
@@ -215,8 +215,7 @@
|
||||||
|
++ " in " ++ binPref)
|
||||||
|
inPath <- isInSearchPath binPref
|
||||||
|
when (not inPath) $
|
||||||
|
- warn verbosity ("The directory " ++ binPref
|
||||||
|
- ++ " is not in the system search path.")
|
||||||
|
+ warn verbosity ("Executable installed in " ++ binPref)
|
||||||
|
case compilerFlavor (compiler lbi) of
|
||||||
|
GHC -> GHC.installExe verbosity lbi binPref buildPref progFix pkg_descr exe
|
||||||
|
GHCJS -> GHCJS.installExe verbosity lbi binPref buildPref progFix pkg_descr exe
|
11
ghc-gen_contents_index-nodocs.patch
Normal file
11
ghc-gen_contents_index-nodocs.patch
Normal file
@ -0,0 +1,11 @@
|
|||||||
|
--- ghc-8.6.5/libraries/gen_contents_index~ 2020-02-24 15:02:26.318866694 +0800
|
||||||
|
+++ ghc-8.6.5/libraries/gen_contents_index 2020-04-09 18:18:40.290722327 +0800
|
||||||
|
@@ -47,6 +47,8 @@
|
||||||
|
HADDOCK_ARGS="$HADDOCK_ARGS $HADDOCK_ARG"
|
||||||
|
done
|
||||||
|
else
|
||||||
|
+ if ! ls */*.haddock &>/dev/null; then exit 0; fi
|
||||||
|
+
|
||||||
|
HADDOCK=/usr/bin/haddock
|
||||||
|
# We don't want the GHC API to swamp the index
|
||||||
|
HADDOCK_FILES=`ls -1 */*.haddock | grep -v '/ghc\.haddock' | sort`
|
228
ghc-pkg.man
Normal file
228
ghc-pkg.man
Normal file
@ -0,0 +1,228 @@
|
|||||||
|
.TH ghc-pkg 1 "2010-01-27"
|
||||||
|
.SH NAME
|
||||||
|
ghc-pkg \- GHC Haskell Cabal package manager
|
||||||
|
.SH SYNOPSIS
|
||||||
|
.B ghc-pkg
|
||||||
|
.I action
|
||||||
|
.RI [ OPTION ]...
|
||||||
|
.SH DESCRIPTION
|
||||||
|
A package is a library of Haskell modules known to the compiler. The
|
||||||
|
.B ghc-pkg
|
||||||
|
tool allows adding or removing them from a package database. By
|
||||||
|
default, the system-wide package database is modified, but
|
||||||
|
alternatively the user's local package database or another specified
|
||||||
|
file can be used.
|
||||||
|
.PP
|
||||||
|
To make a package available for
|
||||||
|
.BR ghc ,
|
||||||
|
.B ghc-pkg
|
||||||
|
can be used to register it. Unregistering it removes it from the
|
||||||
|
database. Also, packages can be hidden, to make
|
||||||
|
.B ghc
|
||||||
|
ignore the package by default, without uninstalling it. Exposing a
|
||||||
|
package makes a hidden package available. Additionally,
|
||||||
|
.B ghc-pkg
|
||||||
|
has various commands to query the package database.
|
||||||
|
.PP
|
||||||
|
Where a package name is required, the package can be named in full
|
||||||
|
including the version number (e.g.
|
||||||
|
.BR network-1.0 ),
|
||||||
|
or without the version number. Naming a package without the version
|
||||||
|
number matches all versions of the package; the specified action will
|
||||||
|
be applied to all the matching packages. A package specifier that
|
||||||
|
matches all version of the package can also be written
|
||||||
|
.BR pkg-* ,
|
||||||
|
to make it clearer that multiple packages are being matched.
|
||||||
|
.SH ACTIONS
|
||||||
|
.TP
|
||||||
|
\fBregister\fP \fIfilename\fP|\fB-\fP
|
||||||
|
Register the package using the specified installed package
|
||||||
|
description.
|
||||||
|
.TP
|
||||||
|
\fBupdate\fP \fIfilename\fP|\fB-\fP
|
||||||
|
Register the package, overwriting any other package with the same
|
||||||
|
name.
|
||||||
|
.TP
|
||||||
|
\fBunregister\fP \fIpkg-id\fP
|
||||||
|
Unregister the specified package.
|
||||||
|
.TP
|
||||||
|
\fBexpose\fP \fIpkg-id\fP
|
||||||
|
Expose the specified package.
|
||||||
|
.TP
|
||||||
|
\fBhide\fP \fIpkg-id\fP
|
||||||
|
Hide the specified package
|
||||||
|
.TP
|
||||||
|
\fBlist\fP \fR[\fIpkg\fR]...\fP
|
||||||
|
List registered packages in the global database, and also the user
|
||||||
|
database if
|
||||||
|
.B --user
|
||||||
|
is given. If a package name is given all the registered versions will
|
||||||
|
be listed in ascending order. Accepts the
|
||||||
|
.B --simple-output
|
||||||
|
flag.
|
||||||
|
.TP
|
||||||
|
.B dot
|
||||||
|
Generate a graph of the package dependencies in a form suitable for
|
||||||
|
input for the graphviz tools. For example, to generate a PDF of the
|
||||||
|
dependency graph:
|
||||||
|
.br
|
||||||
|
\fB dot \| tred \| dot -Tpdf >pkgs.pdf\fP
|
||||||
|
.TP
|
||||||
|
\fBfind-module\fP \fImodule\fP
|
||||||
|
List registered packages exposing module
|
||||||
|
.I module
|
||||||
|
in the global database, and also the user database if
|
||||||
|
.B --user
|
||||||
|
is given. All the registered versions will be listed in ascending
|
||||||
|
order. Accepts the
|
||||||
|
.B --simple-output
|
||||||
|
flag.
|
||||||
|
.TP
|
||||||
|
\fBlatest\fP \fIpkg-id\fP
|
||||||
|
Prints the highest registered version of a package.
|
||||||
|
.TP
|
||||||
|
.B check
|
||||||
|
Check the consistency of package dependencies and list broken
|
||||||
|
packages. Accepts the
|
||||||
|
.B --simple-output
|
||||||
|
flag.
|
||||||
|
.TP
|
||||||
|
\fBdescribe\fP \fIpkg\fP
|
||||||
|
Give the registered description for the
|
||||||
|
specified package. The description is returned in precisely the syntax
|
||||||
|
required by ghc-pkg register.
|
||||||
|
.TP
|
||||||
|
\fBfield\fP \fIpkg field\fP
|
||||||
|
Extract the specified field of the package description for the
|
||||||
|
specified package. Accepts comma-separated multiple fields.
|
||||||
|
.TP
|
||||||
|
.B dump
|
||||||
|
Dump the registered description for every package. This is like
|
||||||
|
.BR ghc-pkg\ describe\ '*' ,
|
||||||
|
expect that it is intended to be used by tools that parse the results,
|
||||||
|
rather than humans.
|
||||||
|
.TP
|
||||||
|
.B recache
|
||||||
|
Regenerate the package database cache. This command should only be
|
||||||
|
necessary if you added a package to the database by dropping a file
|
||||||
|
into the database directory manyally. By default, the global DB is
|
||||||
|
recached; to recache a different DB use
|
||||||
|
.B --user
|
||||||
|
or
|
||||||
|
.B --package-conf
|
||||||
|
as appropriate.
|
||||||
|
.SH OPTIONS
|
||||||
|
When asked to modify a database
|
||||||
|
.RB ( register ,\ unregister ,\ update ,\ hide ,\ expose ,\ and\ also\ check ),
|
||||||
|
.B ghc-pkg
|
||||||
|
modifies the global database by
|
||||||
|
default. Specifying
|
||||||
|
.B --user
|
||||||
|
causes it to act on the user database,
|
||||||
|
or
|
||||||
|
.B --package-conf
|
||||||
|
can be used to act on another database
|
||||||
|
entirely. When multiple of these options are given, the rightmost
|
||||||
|
one is used as the database to act upon.
|
||||||
|
.PP
|
||||||
|
Commands that query the package database
|
||||||
|
.RB ( list ,\ latest ,\ describe ,\ field )
|
||||||
|
operate on the list of databases specified by the flags
|
||||||
|
.BR --user ,\ --global ,
|
||||||
|
and
|
||||||
|
.BR --package-conf .
|
||||||
|
If none of these flags are
|
||||||
|
given, the default is
|
||||||
|
.BR --global\ --user .
|
||||||
|
.TP
|
||||||
|
.B --user
|
||||||
|
Use the current user's package database.
|
||||||
|
.TP
|
||||||
|
.B --global
|
||||||
|
Use the global package database.
|
||||||
|
.TP
|
||||||
|
\fB-f\fP \fIFILE\fP, \fB--package-conf=\fIFILE\fP
|
||||||
|
Use the specified package config file.
|
||||||
|
.TP
|
||||||
|
.BI --global-conf= FILE
|
||||||
|
Location of the global package config.
|
||||||
|
.TP
|
||||||
|
.B --force
|
||||||
|
Ignore missing dependencies, directories, and libraries.
|
||||||
|
.TP
|
||||||
|
.B --force-files
|
||||||
|
Ignore missing directories and libraries only.
|
||||||
|
.TP
|
||||||
|
.BR -g ,\ --auto-ghc-libs
|
||||||
|
Automatically build libs for GHCi (with register).
|
||||||
|
.TP
|
||||||
|
.BR -? ,\ --help
|
||||||
|
Display a help message and exit.
|
||||||
|
.TP
|
||||||
|
.BR -V ,\ --version
|
||||||
|
Output version information and exit.
|
||||||
|
.TP
|
||||||
|
.B --simple-output
|
||||||
|
Print output in easy-to-parse format for some commands.
|
||||||
|
.TP
|
||||||
|
.B --names-only
|
||||||
|
Only print package names, not versions; can only be used with
|
||||||
|
.BR list\ --simple-output .
|
||||||
|
.TP
|
||||||
|
.B --ignore-case
|
||||||
|
Ignore case for substring matching.
|
||||||
|
.SH ENVIRONMENT VARIABLES
|
||||||
|
.TP
|
||||||
|
.B GHC_PACKAGE_PATH
|
||||||
|
The
|
||||||
|
.B GHC_PACKAGE_PATH
|
||||||
|
environment variable may be set to a
|
||||||
|
.BR : -separated
|
||||||
|
list of files containing package databases. This list of package
|
||||||
|
databases is used by
|
||||||
|
.B ghc
|
||||||
|
and
|
||||||
|
.BR ghc-pkg ,
|
||||||
|
with earlier databases in the list overriding later ones. This order
|
||||||
|
was chosen to match the behaviour of the
|
||||||
|
.B PATH
|
||||||
|
environment variable; think of it as a list of package databases that
|
||||||
|
are searched left-to-right for packages.
|
||||||
|
|
||||||
|
If
|
||||||
|
.B GHC_PACKAGE_PATH
|
||||||
|
ends in a separator, then the default user and system package
|
||||||
|
databases are appended, in that order. e.g. to augment the usual set
|
||||||
|
of packages with a database of your own, you could say:
|
||||||
|
|
||||||
|
.br
|
||||||
|
\fB export GHC_PACKAGE_PATH=$HOME/.my-ghc-packages.conf:\fP
|
||||||
|
.br
|
||||||
|
|
||||||
|
To check whether your
|
||||||
|
.B GHC_PACKAGE_PATH
|
||||||
|
setting is doing the right thing,
|
||||||
|
.B ghc-pkg list
|
||||||
|
will list all the databases in use, in the reverse order they are
|
||||||
|
searched.
|
||||||
|
.SH FILES
|
||||||
|
Both of these locations are changed for Debian. Upstream still keeps
|
||||||
|
these under
|
||||||
|
.IR /usr .
|
||||||
|
Some programs may refer to that, but look in
|
||||||
|
.I /var
|
||||||
|
instead.
|
||||||
|
.TP
|
||||||
|
.I /var/lib/ghc/package.conf
|
||||||
|
Global package.conf file.
|
||||||
|
.TP
|
||||||
|
.I /var/lib/ghc/package.conf.d/
|
||||||
|
Directory for library specific package.conf files. These are added to
|
||||||
|
the global registry.
|
||||||
|
.SH "SEE ALSO"
|
||||||
|
.BR ghc (1),
|
||||||
|
.BR runghc (1),
|
||||||
|
.BR hugs (1).
|
||||||
|
.SH AUTHOR
|
||||||
|
This manual page was written by Kari Pahula <kaol@debian.org>, for the
|
||||||
|
Debian project (and may be used by others).
|
12
ghc-warnings.mk-CC-Wall.patch
Normal file
12
ghc-warnings.mk-CC-Wall.patch
Normal file
@ -0,0 +1,12 @@
|
|||||||
|
--- ghc-8.4.3/mk/warnings.mk~ 2018-02-04 02:30:11.000000000 +0900
|
||||||
|
+++ ghc-8.4.3/mk/warnings.mk 2018-09-29 14:33:37.607884921 +0900
|
||||||
|
@@ -1,6 +1,6 @@
|
||||||
|
# See Note [Order of warning flags].
|
||||||
|
-SRC_CC_OPTS += -Wall $(WERROR)
|
||||||
|
+#SRC_CC_OPTS += -Wall $(WERROR)
|
||||||
|
SRC_HC_OPTS += -Wall
|
||||||
|
# Don't add -Werror to SRC_HC_OPTS_STAGE0 (or SRC_HC_OPTS), because otherwise
|
||||||
|
# validate may unnecessarily fail when booting with an older compiler.
|
||||||
|
# It would be better to only exclude certain warnings from becoming errors
|
||||||
|
|
||||||
|
Diff finished. Sat Sep 29 14:35:43 2018
|
File diff suppressed because it is too large
Load Diff
231
haddock.man
Normal file
231
haddock.man
Normal file
@ -0,0 +1,231 @@
|
|||||||
|
.TH HADDOCK 1 "July 2010" "Haddock, version 2.6.1" "Haddock documentation generator"
|
||||||
|
|
||||||
|
|
||||||
|
.SH NAME
|
||||||
|
haddock \- documentation tool for annotated Haskell source code
|
||||||
|
|
||||||
|
|
||||||
|
.SH SYNOPSIS
|
||||||
|
.B haddock
|
||||||
|
.RI [ options ] " file" ...
|
||||||
|
|
||||||
|
|
||||||
|
.SH DESCRIPTION
|
||||||
|
This manual page documents briefly the
|
||||||
|
.B haddock
|
||||||
|
command.
|
||||||
|
Extensive documentation is available in various other formats including DVI,
|
||||||
|
PostScript and HTML; see below.
|
||||||
|
|
||||||
|
.PP
|
||||||
|
.I file
|
||||||
|
is a filename containing a Haskell source module.
|
||||||
|
All the modules specified on the command line will be processed together.
|
||||||
|
When one module refers to an entity in another module being processed, the
|
||||||
|
documentation will link directly to that entity.
|
||||||
|
|
||||||
|
Entities that cannot be found, for example because they are in a module that
|
||||||
|
is not being processed as part of the current batch, simply will not be
|
||||||
|
hyperlinked in the generated documentation.
|
||||||
|
.B haddock
|
||||||
|
will emit warnings listing all the identifiers it could not resolve.
|
||||||
|
|
||||||
|
The modules should not be mutually recursive, as
|
||||||
|
.B haddock
|
||||||
|
does not like swimming in circles.
|
||||||
|
|
||||||
|
|
||||||
|
.SH OPTIONS
|
||||||
|
The programs follow the usual GNU command line syntax, with long
|
||||||
|
options starting with two dashes (`--').
|
||||||
|
A summary of options is included below.
|
||||||
|
For a complete description, see the other documentation.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-o \fIDIR\fP, \-\-odir=\fIDIR\fP
|
||||||
|
directory in which to put the output files
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-i \fIFILE\fP, \-\-read-interface=\fIFILE\fP
|
||||||
|
read an interface from
|
||||||
|
.IR FILE .
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-D \fIFILE\fP, \-\-dump\-interface=\fIFILE\fP
|
||||||
|
dump an interface for these modules in
|
||||||
|
.IR FILE .
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-l \fIDIR\fP, \-\-lib=\fIDIR\fP
|
||||||
|
location of Haddock's auxiliary files
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-h ", " \-\-html
|
||||||
|
Generate documentation in HTML format.
|
||||||
|
Several files will be generated into the current directory (or the specified
|
||||||
|
directory if the
|
||||||
|
.B \-o
|
||||||
|
option is given), including the following:
|
||||||
|
.RS
|
||||||
|
.TP
|
||||||
|
.I index.html
|
||||||
|
The top level page of the documentation:
|
||||||
|
lists the modules available, using indentation to represent the hierarchy if
|
||||||
|
the modules are hierarchical.
|
||||||
|
.TP
|
||||||
|
.I haddock.css
|
||||||
|
The stylesheet used by the generated HTML.
|
||||||
|
Feel free to modify this to change the colors or layout, or even specify
|
||||||
|
your own stylesheet using the
|
||||||
|
.B \-\-css
|
||||||
|
option.
|
||||||
|
.TP
|
||||||
|
.I module.html
|
||||||
|
An HTML page for each module.
|
||||||
|
.TP
|
||||||
|
.IR doc-index.html ", " doc-index-XX.html
|
||||||
|
The index, split into two (functions/constructors and types/classes, as per
|
||||||
|
Haskell namespaces) and further split alphabetically.
|
||||||
|
.RE
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.B \-\-hoogle
|
||||||
|
output for Hoogle
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-html\-help=\fIformat
|
||||||
|
produce index and table of contents in mshelp, mshelp2 or devhelp format
|
||||||
|
(with \fI\-h\fP)
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-source\-base=\fPURL
|
||||||
|
Include links to the source files in the generated documentation, where URL
|
||||||
|
is the base URL where the source files can be found.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-s \fPURL, \fB\-\-source\-module=\fPURL
|
||||||
|
Include links to the source files in the generated documentation, where URL
|
||||||
|
is a source code link for each module (using the %{FILE} or %{MODULE} vars).
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-source\-entity=\fPURL
|
||||||
|
Include links to the source files in the generated documentation, where URL
|
||||||
|
is a source code link for each entity (using the %{FILE}, %{MODULE} or %{NAME} vars).
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-comments\-base=\fPURL
|
||||||
|
URL for a comments link on the contents and index pages.
|
||||||
|
.TP
|
||||||
|
\fB\-\-comments\-module=\fPURL
|
||||||
|
URL for a comments link for each module (using the %{MODULE} var).
|
||||||
|
.TP
|
||||||
|
\fB\-\-comments\-entity=\fPURL
|
||||||
|
URL for a comments link for each entity (using the %{FILE}, %{MODULE} or %{NAME} vars).
|
||||||
|
.TP
|
||||||
|
.BI \-\-css= FILE
|
||||||
|
Use the CSS
|
||||||
|
.I FILE
|
||||||
|
instead of the default stylesheet that comes with
|
||||||
|
.B haddock
|
||||||
|
for HTML output. It should specify certain classes: see the default stylesheet for details.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-p \fIFILE\fP, \-\-prologue=\fIFILE\fP
|
||||||
|
Specify a file containing prologue text.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-t \fITITLE\fP, \-\-title=\fITITLE\fP
|
||||||
|
Use \fITITLE\fP as the page heading for each page in the documentation.
|
||||||
|
This will normally be the name of the library being documented.
|
||||||
|
|
||||||
|
The title should be a plain string (no markup please!).
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-k \fINAME\fP, \-\-package=\fINAME\fP
|
||||||
|
Specify the package name (optional).
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-n ", " \-\-no\-implicit\-prelude
|
||||||
|
do not assume Prelude is imported
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-d ", " \-\-debug
|
||||||
|
Enable extra debugging output.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-? ", " \-\-help
|
||||||
|
Display help.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-V ", " \-\-version
|
||||||
|
Display version.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.BR \-v ", " \-\-verbose
|
||||||
|
Verbose status reporting.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-use\-contents=\fPURL
|
||||||
|
Use a separately-generated HTML contents page.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.B \-\-gen\-contents
|
||||||
|
Generate an HTML contents from specified interfaces.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-use\-index=\fPURL
|
||||||
|
Use a separately-generated HTML index.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.B \-\-gen\-index
|
||||||
|
Generate an HTML index from specified interfaces.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
.B \-\-ignore\-all\-exports
|
||||||
|
Behave as if all modules have the ignore-exports atribute
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-hide=\fIMODULE
|
||||||
|
Behave as if \fIMODULE\fP has the hide attribute.
|
||||||
|
|
||||||
|
.TP
|
||||||
|
\fB\-\-use\-package=\fIPACKAGE
|
||||||
|
The modules being processed depend on \fIPACKAGE\fP.
|
||||||
|
|
||||||
|
.SH FILES
|
||||||
|
.I /usr/bin/haddock
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/plus.gif
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/minus.gif
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/haskell_icon.gif
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/haddock.js
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/haddock.css
|
||||||
|
.br
|
||||||
|
.I /usr/share/haddock-2.6.1/html/haddock-DEBUG.css
|
||||||
|
|
||||||
|
.SH SEE ALSO
|
||||||
|
.IR /usr/share/doc/haddock/ ,
|
||||||
|
.br
|
||||||
|
the Haddock homepage
|
||||||
|
.UR http://haskell.org/haddock/
|
||||||
|
(http://haskell.org/haddock/)
|
||||||
|
.UE
|
||||||
|
|
||||||
|
.SH COPYRIGHT
|
||||||
|
Haddock version 2.6.1
|
||||||
|
|
||||||
|
Copyright 2006-2010 Simon Marlow <simonmar@microsoft.com>, Dawid Waern <david.waern@gmail.com>.
|
||||||
|
All rights reserved.
|
||||||
|
|
||||||
|
|
||||||
|
.SH AUTHOR
|
||||||
|
This manual page was written by Michael Weber <michaelw@debian.org>
|
||||||
|
for the Debian GNU/Linux system (but may be used by others).
|
||||||
|
|
||||||
|
.\" Local variables:
|
||||||
|
.\" mode: nroff
|
||||||
|
.\" End:
|
10
libraries-versions.sh
Executable file
10
libraries-versions.sh
Executable file
@ -0,0 +1,10 @@
|
|||||||
|
#!/bin/sh
|
||||||
|
|
||||||
|
if [ ! -d libraries ]; then
|
||||||
|
echo Is CWD a ghc source tree?
|
||||||
|
exit 1
|
||||||
|
fi
|
||||||
|
|
||||||
|
cd libraries
|
||||||
|
|
||||||
|
grep -i ^version: Cabal/Cabal/Cabal.cabal */*.cabal | grep -v -e "\(Win32\|gmp.old\|gmp2\|integer-simple\)" | sed -e "s!/.*: \+!-!"
|
45
runghc.man
Normal file
45
runghc.man
Normal file
@ -0,0 +1,45 @@
|
|||||||
|
.TH RUNGHC 1 "28 NOVEMBER 2007"
|
||||||
|
.SH NAME
|
||||||
|
runghc \- program to run Haskell programs without first having to compile them.
|
||||||
|
.SH SYNOPSIS
|
||||||
|
.B runghc
|
||||||
|
.RI
|
||||||
|
[runghc|flags] [GHC|flags] module [program|flags]...
|
||||||
|
.br
|
||||||
|
.SH DESCRIPTION
|
||||||
|
.B runghc
|
||||||
|
is considered a non-interactive interpreter and part of The Glasgow Haskell Compiler.
|
||||||
|
.B runghc
|
||||||
|
is a compiler that automatically runs its results at the end.
|
||||||
|
.PP
|
||||||
|
.SH OPTIONS
|
||||||
|
.TP
|
||||||
|
the flags are:
|
||||||
|
.TP
|
||||||
|
.B \-f
|
||||||
|
it tells runghc which GHC to use to run the program. If it is not given then runghc will search for GHC in the directories in the system search path. runghc -f /path/to/ghc
|
||||||
|
.TP
|
||||||
|
.B \--
|
||||||
|
runghc will try to work out where the boundaries between [runghc flags] and [GHC flags], and [GHC flags] and module are, but you can use a -- flag if it doesn't get it right. For example, runghc -- -fglasgow-exts Foo
|
||||||
|
means runghc won't try to use glasgow-exts as the path to GHC, but instead will pass the flag to GHC.
|
||||||
|
|
||||||
|
.SH EXAMPLES
|
||||||
|
.TP
|
||||||
|
.B runghc foo
|
||||||
|
.PP
|
||||||
|
.B runghc -f /path/to/ghc foo
|
||||||
|
.TP
|
||||||
|
.B runghc -- -fglasgow-exts Foo
|
||||||
|
|
||||||
|
.SH SEE ALSO
|
||||||
|
.BR ghc (1),
|
||||||
|
.BR ghci (1).
|
||||||
|
.br
|
||||||
|
|
||||||
|
.SH COPYRIGHT
|
||||||
|
Copyright 2002, The University Court of the University of Glasgow. All rights reserved.
|
||||||
|
|
||||||
|
.SH AUTHOR
|
||||||
|
This manual page was written by Efrain Valles Pulgar <effie.jayx@gmail.com>. This is free documentation; see the GNU
|
||||||
|
General Public Licence version 2 or later for copying conditions. There is NO WARRANTY.
|
||||||
|
|
3
sources
Normal file
3
sources
Normal file
@ -0,0 +1,3 @@
|
|||||||
|
SHA512 (ghc-8.8.4-src.tar.xz.sig) = 1ed2e64e8b75a147d7c66b0018119f54ac740131b6f74612aa975c9120d8f7a8a2286829cef22ef2cd16262af0604659daa41c09ef3bdec6c22b8d086fbc1166
|
||||||
|
SHA512 (ghc-8.8.4-src.tar.xz) = efd23bd819f7429486696a3a929a040471db7ea8a2d1f1d832e4cf0825b9e1e0c5e6ecad0ab8376f58b74e9c28c1d2f773bd126596d6d853c9e57d57e5ceb090
|
||||||
|
SHA512 (llvm-7.0.1.src.tar.xz) = ac43a3cb71a53deb55e3693653847cf20bf6f5d9056f224e6956c96d63bc59ebee9404f088eec9cabe65337b4607a905ef931354b373cf64e0004c6905a6b5df
|
Loading…
Reference in New Issue
Block a user