[commit: ghc] wip/T15050's head updated: Merge branch 'master' into wip/T15050 (f20381d)
git at git.haskell.org
git at git.haskell.org
Tue Jul 17 15:53:01 UTC 2018
Repository : ssh://git@git.haskell.org/ghc
Branch 'wip/T15050' now includes:
e732210 ghc-prim: Refactor and document __sync_fetch_and_nand workaround
1126e69 testsuite: Fix overflow in T13623 on 32-bit machines
ec9638b testsuite: Fix T4442 on 32-bit architectures
acb7361 Stable.c: minor refactoring, add/update some comments
625eea9 Update Hadrian submodule
3d38e82 Do not unpack class dictionaries with INLINABLE
693857f Comments only
705dcb0 Refactor in OccurAnal
313720a Rename a local variable
c3823cb TTG : complete for balance of hsSyn AST
56bbe1e Add missing stdout file for T14955
512f503 Minor refactoring in Exitify
69119b2 Comments only: the FVAnn invariant
0c01224 Refactor tcExtendLocalFamInst a bit
08003e7 Make out-of-scope errors more prominent
6da5b87 Better linting for types
4e45ebe Add test case for #15108
07cc603 Don't crash when pretty-printing bad joins
d4cc74f Preserve join-point arity in CoreOpt
b5739bd rts: Don't disable formatting warning in RetainerSet.c
6212d01 testsuite: Bump performance meterics due to 3d38e8284b73
260e23b rts: Add -hT to the rts usage message
b7b6617 rts: Allow profiling by closure type in prof way
60f9e46 Exitify: Do not trip over shadowing (fixes #15110)
dc655bf errorWithoutStackTrace: omit profiling stack trace (#14970)
4cb5595 storageAddCapabilities: fix bug in updating nursery pointers
198db04 Set arity for absentError
6742ce2 Test Trac #15114
5de0be8 Add regression tests for #14904
358b508 Compute DW_FORM_block length correctly; also fixes #15068
e34e30e Warn against using Data.Monoid.First
90589a9 document the plan for removing Data.Semigroup.Option
cf35ab9 minor improvement to wording of warning against First. Add warning against Last
107d2cb Don't shadow "result" in JUnit driver
1ad0277 CircleCI: Save test results as JUnit XML
75361b1 Fix NUMA support on Windows (#15049)
6132d7c Correctly add unwinding info in manifestSp and makeFixupBlocks
866525a Move the ResponseFile module from haddock into base
721e826 GHCi: Improve the error message for hidden packages
6462d90 rts: Throw better error if --numa is used without libnuma support
79c4f10 Enable warning flags to safe-guard against regressions in `base`
5697432 Normalize T14999 test output some more
33de71f Simplify callSiteInline a little
b750dcc testsuite: Bump T9630 allocations as a result of 33de71fa06d0
56e8c6f Update docker images to use GHC 8.4.2 and cabal-install-2.2
13e8bc0 Fix typo in user guide about promoted list
49f5943 rel-notes: Note that -hT is now allowed
426ae98 Split TrieMap into a general (TrieMap) and core specific (CoreTrieMap) module.
361d23a Normalize the element type of ListPat, fix #14547
0f046aa testsuite: Add test for #15067
cb1ee7e Do not supply `-mcpu` if `-optlc` provides `-mcpu` already.
418881f Use unsafeInsertNew to create timers in TimerManager
6243bba Add 'addWordC#' PrimOp
be580b4 Add test for invertability of `Floating` methods.
d814dd3 Add hyperbolic functions to test of Float-inverses
3ea3341 Stable area hyperbolic sine for `Double` and `Float`.
46548ed base/changelog: Note stabilization of asinh (#14927)
7271db4 testsuite: Bump T5631 expected allocations
875b61e printStackChunk: recognise a few more ret frames
61b245a Small refactoring in Exitify
5b3104a Used named fields for DataDeclRn
aa03ad8 Simplify the kind checking for type/class decls
37acca7 users-guide: Move discussion MAX_PATH out of release notes
280de0c Revert "Normalize the element type of ListPat, fix #14547"
981bf47 Normalize the element type of ListPat, fix #14547
849547b Revert "Normalize the element type of ListPat, fix #14547"
ba6e445 Normalize the element type of ListPat, fix #14547
5fe6aaa Add -fghci-leak-check to check for space leaks
b2ff5dd Fix #15038
e5bb515 rts: remove unused round_up_to_mblocks function
87e169a Revert "Add -fghci-leak-check to check for space leaks"
40a76c9 BlockAlloc.c: reuse tail_of function
cb5c2fe Fix unwinding of C -> Haskell FFI calls with -threaded
3781034 Expand $tooldir in ghc --info output
2323ffd Adds CTRL-C handler in Windows's timeout (trac issue #12721)
bec2e71 Revert "Fix unwinding of C -> Haskell FFI calls with -threaded"
78db41e Use correct source spans for EmptyCase
00049e2 Emit info-level log message when package envs are loaded
6ab7cf9 Simplify -ddump-json implementation
9039f84 base: Fix handling of showEFloat (Just 0)
f0212a9 TcInteract: Ensure that tycons have representations before solving for Typeable
2188427 Bump array submodule
7c665f9 Refactor LitString
eb39f98 Fix a few GCC warnings
2828dbf Fix changelog message for asinh
cdbe00f Remove unused things from utils/Digraph
d4abd03 rts: Compile with gcc -Og
30c887d GHCi: Include a note in the hint to expose a hidden package
48dee7c Clarify what the FFI spec says
bf6cad8 Add note documenting refineDefaultAlt
21e1a00 Fix #14875 by introducing PprPrec, and using it
cf88c2b ghc-pkg: Configure handle encodings
8f3c149 Add support for opting out of package environments
ca3d303 Fix another batch of `./validate --slow` failures
b713986 Improve some Foldable methods for NonEmpty
6d57a92 utils/fs: use <sys/stat.h>, not <sys\stat.h>
e408d03 Fix #14973
1e27209 Revert "rts: Compile with gcc -Og"
d92c755 Fix performance regressions from #14737
79bbb23 rts: export new absentSumFieldError from base
f49f90b Tidy up error suppression
df6670e testsuite: Fix expected allocations of T9020 and T12425
9dbf66d Revert "Simplify callSiteInline a little"
45ad0c3 Ensure that RTS cabal file reflects dependency on libnuma
1154c9b More explicit comment on switch in registerDelay
af986f9 testsuite: Disable T14697 on Windows
01b15b8 Calling GetLastError() on Windows for socket IO (trac issue #12012)
bb338f2 Algebraically simplify add/sub with carry/overflow
bb3fa2d Less Tc inside simplCore (Phase 1 for #14391)
a18e7df Force findPtr to be included in the binary
eb8e692 An overhaul of the SRT representation
fbd28e2 Allow CmmLabelDiffOff with different widths
2b0918c Save a word in the info table on x86_64
838b690 Merge FUN_STATIC closure with its SRT
01bb17f Make finalizers more reliable.
3310f7f InfoTables: Fix #if uses introduced by D4634
126b412 Add pprTraceM to Outputable as analog to traceM.
99f8cc8 Fix #15039 by pretty-printing equalities more systematically
4ffaf4b Improve numeric stability of numericEnumFrom for floating numbers
0c7db22 Fix #15073 by suggesting UnboxedTuples in an error message
f2d27c1 Comments and refactoring only
b701e47 Update Cabal submodule
5f15d53 Add /* fallthrough */ to fix -Wimplicit-fallthrough warning
f27e4f6 Fix GHCi space leaks (#15111)
5d3b15e Fix unwinding of C -> Haskell FFI calls with -threaded (2nd try)
819b9cf Add regression tests for #11515 and #12563
797a462 Comments only
efe4054 Tiny refactor
2bbdd00 Orient TyVar/TyVar equalities with deepest on the left
5a7c657 Debug tracing only
ae292c6 Do not unify representational equalities
d78dde9 Fix retainer profiling after SRT overhaul
c617c1f base: Add Foldable and Traversable instances for Alt
9171c7f base: Fix typo
c4219d9 Another batch of './validation --slow' tweaks
12deb9a rts: Fix compaction of SmallMutArrPtrs
ec22f7d Add HeapView functionality
e1fd946 ghc-prim: Bump version
1cdc14f ghc-pkg: recompute `abi-depends` for updated packages
f2ce86c Do better sharing in the short-cut solver
5f3fb71 Fix perf numbers for #15164
b7e80ae Remove TcType.toTcType
57858fc Make dischargeFmv handle Deriveds
af0757d Check for type families in an instance context
97121b6 Revert "ghc-pkg: recompute `abi-depends` for updated packages"
db6085b Improve performance of CallArity
928f606 Typo in comments
49a832d Remove special case from TcTyVar level check
86bba7d Add missing check to isReflCoVar_maybe
d191db4 Don't expose strictness when sm_inline is False
a32c8f7 Use dischargeFunEq consistently
d424d4a Fix a bug in SRT generation
bf10456 Disable the SRT offset optimisation on MachO platforms
49691c4 testsuite: Bump OS X performance numbers
1879d9d Check for mismatched class methods during typechecking
979f085 Clean up the conflicting data family instances error message
5ca623a Minor typos
5b6ef59 Add -fghci-leak-check to check for space leaks
c618732 isDllName: use Opt_ExternalDynamicRefs, not WayDyn
40d5b9e Comments about the substition invariant
11eed2f testsuite: Don't rely on find command in T15038
72835ff Add regression test for #11766
00f7e28 Add regression test for #14172
9ed7e8d Add regression test for #14246
6a9b9b4 Mark #12447's test case as expected to pass
b67e8a3 base: Introduce Data.Monoid.Ap
a5446c4 Update GHC.Stats docs
4778cba Fix 32 bit windows build
60fb2b2 Clean up Windows testsuite failures
f804811 Factor stack chunk printing out of printTSO
25f01db Typofixes [ci skip]
6848a99 remove dead maybeIsLFCon
36656b9 Typofix in manual [ci skip]
d14b1ec Minor refactoring
9969863 Use a less confusing type variable in a few types
576078a base: Improve zip documentation
5e91cde Unmask readMVar in readChan
fa2d7e1 testsuite: Fix incorrectly capitalized True in testlib.py
1245835 testsuite: Use /usr/bin/env instead of /bin/bash
929bbe4 Handle TREC_CHUNK in printClosure
857005a Move printMutableList to Printer.c next to other printers
e4003b6 llvm-targets: Add versioned ARM targets
bdfc85b Fix validate for GHCi without TABLES_NEXT_TO_CODE
bd429dc Update repository sub-dir for ghc-heap in ghc-heap.cabal.in
2ea93a7 Improve the documentation of lexically scoped type variables
8fe99c7 Remove incorrect comment
9ded0d6 Delete duplicate definition of fingerprintByteString
c65159d T14732 now passes with the profasm way
49e423e Put the `ev_binds` of main function inside `runMainIO`
34464fe rts: Don't madvise if mmap failed
9aac442 Define MCoercion type
a4ae199 Extract hard-coded LLVM opt flags into a file
b876c1b users-guide: Point out GNTD may require additional extensions
e0b44e2 Improved Valid Hole Fits
1d1e2b7 Implement "An API for deciding whether plugins should cause recompilation"
64fd0fa ghc-heap: Add dependency from GHC.Exts.Heap.Closures to InfoTableProf
5030109 testsuite: Fix hashbangs
730781b rts/posix: Use less aggressive backoff schedule for heap reservation sizing
b57a54f SplicePat's should not trip -Wunused-pattern-binds
91a82de testsuite: Make T3234 more robust
15ece72 base: Improve documentation of indexArray#
533d345 configure: Make sphinx-build version test work on recent versions
471b2a0 users-guide: Fix various issues in debugging flags section
d1beebb Make HsDocString a newtype of ByteString
21a9fb5 base/TimerManager: Clamp timer expiration time to maxBound
b592bd9 dead strip dylibs on macOS
5748c79 Change jump targets in JMP_TBL from blocks to X86.JumpDest.
9921f5b Cleanups [ci skip]
9fd4ed9 UNREG: mark SRT as writable in generated C code
bd43378 Optimizations for CmmBlockElim.
c983a1d testsuite: Add test for #15186
f0c1eb8 Conservatively estimate levity in worker/wrapper
13a8660 Add llvm-target for powerpc64le-unknown-linux
faee23b vectorise: Put it out of its misery
9ea4596 C codegen: print details of pprStatics panics
a122d4f rts: Rip out support for STM invariants
e0f33a6 testsuite: Don't assume location of bash
7272566 Bump version of stm submodule back to 2.4
c2783cc Extended the plugin system to run plugins on more representations
ac91d07 Fix #13777 by improving the underdetermined CUSK error message
18cb4f5 Check for singletons when creating Bag/OrdList from a list.
21e9d4f Fix #15214 by listing (~) in isBuiltInOcc_maybe
2627377 rts: Query system rlimit for maximum address-space size
1626fe6 Handle abi-depends correctly in ghc-pkg
5b82ee6 Remove ~# from surface syntax
4d80044 Fix a bad interaction between GADTs and COMPLETE sets
08073e1 Turn "inaccessible code" error into a warning
9b7eec8 tcExtendTyVarEnv2 changed to tcExtendNameTyVarEnv
f68c2cb Allow aligning of cmm procs at specific boundry
1f88f54 Improve exhaustiveness checking for literal values and patterns, fix #14546
6128037 Fix typo in OverloadedLabels docs
90e99c4 Add tests for #8128 and #8740
b564eb7 testsuite: Mark T14547 as broken
4dd1895 testsuite: Really mark T14547 as broken
554bc7f Provide `getWithUserData` and `putWithUserData`
0e5d2b7 Do a late CSE pass
9d600ea Expand type synonyms when Linting a forall
a1a507a Refactor SetLevels.abstractVars
c560f38 Bump stm and haskeline submodules
d8efb09 Fix broken test T14547.
36091ec Document the fact that cmm dumps won't show unreachable blocks.
7df5896 Implement QuantifiedConstraints
1a61c6b Add Outputable instance for HsArg
97cea31 Improve extendTvSubst assertion
aa77c60 Also suppress uniques in cmm dumps with `-dsuppress-uniques`.
85309a3 Serialize docstrings to ifaces, display them with new GHCi :doc command
8ed8b03 Introduce DerivingVia
4075656 Rename some mutable closure types for consistency
455477a rts: Reuse dbl_link_remove in a few places
d964b05 Let the simplifier know that seq# forces
635a59a Do not scavenge SMALL_MUT_ARR_PTRS_CLEAN in mut_lists
7f45906 Comments only
c16382d Remove ad-hoc special case in occAnal
1508600 testsuite: Fix dynamic-paper stderr file
f741711 Update hadrian submodule
64c71ce Don't use unsafeGlobalDynFlags in optCoercion
db4f064 WorkWrap: Rip out unsafeGlobalDynFlags usage in mkWwInlineRule
e7678d6 Index arrays more eagerly
767536c Fix unparseable pretty-printing of promoted data cons
efea32c Check if both branches of an Cmm if have the same target.
0361fc0 Move 'HsBangTy' out in constructor arguments
5026840 testsuite: Add test for #15232
569c16a Fix #15243 by fixing incorrect uses of NotPromoted
bc9a838 Document #15079 in the users' guide
04e29fc testsuite: Skip T13838 in ghci way
5926b6e Don't expose (~#), (~R#), (~P#) from GHC.Prim
3397396 Fix #15236 by removing parentheses from funTyConName
838cb53 rts: Fix reference to srt_bitmap in ASSERT in RetainerProfile
fa34ced Rename dataConRepNameUnique to dataConTyRepNameUnique
dc8c03b Run typeCheckResultAction and renamedResultAction in TcM rather than Hsc
200c8e0 Allow Haddock comments before function arguments.
6fbe5f2 Move `iserv` into `utils` and change package name from `iserv-bin` to `iserv`
297879a Add support for FreeBSD arm
d66ca01 typecheck: Don't warn about "redundant" TypeError constraints
838aeb9 Run Linux slow validate nightly on Circle CI
40db277 Fix `print-explicit-runtime-reps` (#11786).
a9eb645 users guide: Fix spelling
9976bed rts: Handle SMALL_MUT_ARR_PTRS in checkClosure
bb83831 Do not omit T4030 in GHCi mode
e1f74aa users-guide: Spelling and style pass over QuantifiedConstraints docs
229789a testsuite: Bump performance metrics of T9233 and T13035
14f4347 Bump Cabal submodule
96ddfa4 testsuite: Suppress uniques in T15243 output
93220d4 testsuite: Remove uniques from T15243's stderr output
502026f Make seq# evaluatedness look through casts
25597a9 Comments only
a169149 Remove duplicate quantified constraints
97d0542 Small refactor, adding checkBadTelescope
6ccfa62 Remove a tc-trace
0180230 rts: Fix a var name in a comment, fix a typo
da53417 docs: Add mentions of new plugins mechanisms to users guide
aab3c6d Refactor TcExpr.tcSeq
bb539cf Bump hadrian submodule
a610c21 Fix some of the failures in sanity way
cc78d25 testuite: remove strace call.
b5ccee4 Do not skip conc004 in GHCi way
a3c0b42 testsuite: Print summary even if interrupted
f7b9456 Minor refactoring and docs in selector optimisation
16c70da Disable T12903 on Darwin due to flakiness
f1b097f OptCoercion: Ensure we use new UnivCo provenance to construct optimised cos.
908edbf libiserv: Add license file
3606075 testsuite: Add -fghci-leak-check to expected output on mingw32
5600729 testsuite: Add Windows-specific output for T5611
261209d Duplicated and
97d1419 Update user manual sections for -rtsopts and -with-rtsopts
ca7653a testsuite: Fix T4442 on i386
0238a6c UNREG: PprC: add support for of W32 literals
4a93166 Disable `-fdefer-out-of-scope-variables` in ghci.
8ae7c1b Make Control.Exception.throw levity polymorphic.
5f5d0c9 Mark test broken on powerpc64[le]
87d691c users-guide: Fix PtrRepLifted to LiftedRep
69b50ef Fix deserialization of docs (#15240)
d24e73a Replace `showSDocUnsafe` with `showSDoc` in extending_ghc.rst
233d815 rts: Ignore RLIMIT_AS if it is zero
6f083b3 desugar: Rip out unsafeGlobalDynFlags usage in decomposeRuleLhs
e4c41ec rts: Don't keep findPtr symbol alive if not -DDEBUG
4672e2e relnotes: Add mention of QuantifiedConstraints
d650729 Embrace -XTypeInType, add -XStarIsType
0c5aac8 Revert inadvertant changes to .gitmodules
8ffac59 Revert "rts: Don't keep findPtr symbol alive if not -DDEBUG"
8062d7f Fix binary and haddock submodule commits
f9b925a Bump haddock submodule
3a18a82 Fix broken link
db5ef2b Exclude libraries/libiserv/ghc.mk and other things via .gitignore.
01c9d95 UNREG: PprC: add support for of W16 literals (Ticket #15237)
807ab22 Fix the bind-recovery type
f903e55 Fix corner case in typeKind, plus refactoring
2f6069c Make better "fake tycons" in error recovery
dbe5370 circleci: Remove systemd from Fedora nsswitch configuration
69954a1 Fix documentation for `-dth-dec-file`
b7deeed testsuite: Make T4442 compile on i386 and mark as broken
e6498d6 Bump supported LLVM version to 6.0
78f5344 No Unicode in Parser.y
b67b971 Make NameSort note into proper Note
91822e4 Add "quantified constraint" context in error message, fix #15231.
9c89ef3 Make dtrace enabled GHC work as a bootstrap compiler on FreeBSD
7100850 Use data con name instead of parent in lookupRecFieldOcc
42f3b53 Fix #13833: accept type literals with no FlexibleInstances
fe770c2 Built-in Natural literals in Core
1279428 Quantify unfixed kind variables in CUSKs
8ee9c57 Amend configure script to support lndir build tree
1ab2dcb testsuite: Mark num009 as broken due to #15062
1f2ed99 testsuite: Mark overflow1 as broken on 32-bit platforms due to #15255
86210b2 rts: Use .cfi_{start|end}proc directives
cd95c2f Preserve parenthesis in function application in typechecker
a81b99d Bump nofib submodule
dbc8c0f base: Improve the documentation of the enumFrom series of functions
de34a71 rts: Remove use of __USE_MINGW_ANSI_STDIO
819d8ef circleci: Bump fedora docker image tag
f998947 circleci: Add a reference to the documentation on the Wiki
60e4bb4 Enhanced constant folding
d55035f Revert "Amend configure script to support lndir build tree"
4cd5521 base: Add default implementation for Data.Bits.bitSize
8df2447 Warn about implicit kind variables with -Wcompat
76b343f Revert "rts: Use .cfi_{start|end}proc directives"
0db05ad Bump process submodule
d1c7239 configure: Fail when bootstrapping with GHC 8.2.1
749bc1a testsuite: Mark T3001-2 as broken on 32-bit platforms
9897440 testsuite: Mark print022 as broken on 32-bit platforms
ccd8ce4 Handle DuplicateRecordFields correctly in filterImports (fixes #14487)
df0f148 Improve error message when importing an unusable package
793902e Improve documentation of Eq, Ord instances for Float and Double
c637541 Provide a better error message for unpromotable data constructor contexts
b8e3499 UNREG: fix CmmRegOff large offset handling on W64 platforms
008ea12 Use __FILE__ for Cmm assertion locations, fix #8619
04e9fe5 Add -Werror=compat
50d7b2a Remove accidentally checked-in T14845.stderr
d621644 Fix an infinite loop in niFixTCvSubst
850ae8c Two small refactorings
30b029b Fix typechecking of kind signatures
6ac8a72 Typofixes in docs and comments [ci skip]
de692fd Fix typo in comment only
a9b01c0 Mark some TH tests as req_interp
83a7b1c Adjust comments (Trac #14164)
676c575 Fix API Annotations for GADT constructors
26e9806 Document and simplify tcInstTyBinders
4cdd574 configure: Bump version to 8.6.0
000ac86 testsuite: Bump metrics for T5631 and T6048
50e7bff containers: Bump to 0.6.0.1
f0179e3 testsuite: Skip T11627a and T11627b on Darwin
7b8dcd9 testsuite: Add broken test for #15289
a5eaa0f Tweak wording in documentation
436c0e9 findPtr: don't search the nursery
21fa62f base: Add missing instances for Data.Ord.Down
7363ba4 Revert "containers: Bump to 0.6.0.1"
e839ee2 A few more typofixes in docs/comments [ci skip]
942e6c9 configure: Fix libnuma detection logic
f4dce6c Allow :info for (~) in GHCi
b948398 Remove HsEqTy and XEqTy
76e110f rts: A bit of cleanup of posix itimer implementation
227ede4 Fix gcc.exe: error: CreateProcess: No such file or directory
c35ad6e containers: Bump to 0.6.0.1
c7cd5a6 configure: Set version to 8.7
3048a87 Fix incorrect GHC versioning
50a35e5 Drop redundant Note
32eb419 Instances in no-evidence implications
e065369 Refactor try_solve_fromInstance in shortCutSolver
d5459a3 Remove unnecessary call to checkReductionDepth
122ba98 Move a Note to the module that refers to it
5f06cf6 TTG for IPBind had wrong extension name
391b0ca Explain why opt-cmm is not dumped by ddump-cmm-verbose.
63d474b Include ghc-heap and libiserv in the "package" file.
c7b1e93 rts: Abort if timerfd read fails
67c422c rts/linker/{SymbolExtras,elf_got}.c: map code as read-only
33724fc Remove -Wamp flag
5db9f91 Tweak API Annotations for ConDeclGADT
2896082 Fix error recovery for pattern synonyms
95324f0 Improve tc-tracing a bit
9fc40c7 Refactor the kind-checking of tyvar binders
577399c Coments and debug tracing only
b4d5459 More misc comments
cea409a Remove unused BottomFound from Tick
1c2c2d3 Record some notes about "innocuous" transformations
e53c113 API Annotations when parsing typapp
261dd83 Fix TcLevel manipulation in TcDerivInfer.simplifyDeriv
7a2b5d0 A bit more tc-tracking in TcUnify.uUnfilledVar
bb50eca Remove dead code
629d01a Typofixes in comments and whitespace only [ci skip]
5865e9a Typo fix in rts [skip ci]
3d00208 Add commnent about binder order
4168ee3 rts: Update some comments, minor refactoring
a54c94f Show addresses of live objects in GHCi leak check
437ff69 Add ghc-prim as dependency to ghc-bin
45de833 Clarify role of coercion in flattening function
904abd4 Document SRT scavenging behavior of scavenge_block() and scavenge_one()
4760a8c Add -ddump-rtti to user's guide and man page
9a371d6 A few typofixes in comments
6bb0c5d Don't lock the MVar closure on tryReadMVar
6e4e6d1 Fix mkGadtDecl does not set con_forall correctly
b4e6483 testsuite: remove unused scc001 target
6cb189d RtClosureInspect: add some docs, remove unused stuff
15bb4e0 Fix nptr field alignment in RtClosureInspect
39de4e3 Fix errors caused by invalid candidates leaking from hole fits
e835fdb Add regression test for #15321
f6ac083 Add regression test for #15007
8f44995 Revert "Don't lock the MVar closure on tryReadMVar"
7ce6f64 Add comments on Typeable (n :: Nat)
14dfdf6 Fix comment
45f44e2 Refactor validity checking for constraints
59a15a5 Fix #15307 by making nlHsFunTy parenthesize more
93b7ac8 Fix #15308 by suppressing invisble args more rigorously
132273f Instantiate GND bindings with an explicit type signature
9275186 Fix newtype instance GADTs
5773397 Parenthesize rank-n contexts in Convert
b6a3386 Fix #15331 with careful blasts of parenthesizeHsType
dbdcacf Make ppr_tc_args aware of -fprint-explicit-kinds
9b26aa0 Comment out a pprTrace
45f0026 Accept new stdout for tcrun045
18cedbb Make a variant of mkCastErr for kind coercions
8c628ad Remove BUILD_DPH, not used
de95bf4 circleci: Detect core count
87b28a8 users guide: Mention -fprint-typechecker-elaboration in -ddump-tc docs
f59332f Mark AutoDeriveTypeable as deprecated
fbe162f Add a broken test for lingering state from TH unique names #9693
379bb20 Simplify lintIdUnfolding
987b5e7 Fix for built-in Natural literals desugaring
f03f0d6 testsuite: Add test for #15053
8736715 rts: Enable two-step allocator on FreeBSD
6715373 Revert "rts: Enable two-step allocator on FreeBSD"
6595bee Define an Outputable MCoercion instance
55a3f85 Refactor coercion rule
fd0f033 More refactoring in TcValidity
aedbf7f Fix decompsePiCos and visible type application
03d7268 More tc-tracing
5067b20 Add nakedSubstTy and use it in TcHsType.tcInferApps
8ec2946 Optional context for a quantified constraint
042df60 Unwrap casts before checking vars in eager unifier
030211d Kind-check CUSK associated types separately
cf67e59 Expand and implement Note [The tcType invariant]
7f4dd88 Note [Ordering of implicit variables]
9768c94 Remove bad debugging output.
81d8b17 Add test for Trac #15352
e24da5e Better Note [The well-kinded type invariant]
1c35362 Use IfaceAppArgs to store an IfaceAppTy's arguments
3efd7cd Minor refactoring in CmmUtils.mkLiveness
5ee9a1c Correct Simple to Complex wording
00cb530 Adding missing 'no'
7527d1f Attempt to fix travis build
6a1e7e7 Link to iterate' doesn't work.
8bccefc Register 'haddockHTMLs' for inplace builds
8e51ece Bump xhtml submodule to 3000.2.2.1
471a992 Trac #8581 users_guide/glasgow_exts section 10.7
19e1e6b The Types section in Core-Spec doc is out-dated
7c207c8 Fix gcdExtInteger (trac#15350)
101e904 Make boot work if ACLOCAL_PATH is not set
c4d9834 Add flag to show docs of valid hole fits
234093c Fix handling of ApplicativeDo in TH AST quotes
0f79b0e Fix handling of unbound constructor names in TH #14627
2b1adaa Export findImportUsage and ImportDeclUsage
f282f02 docs: remove leftovers of static flags
305da44 Release notes about source plugins
1a79270 Run the renamed source plugin after each HsGroup
7fc418d Fix deadlock between STM and throwTo
3ee7ca1 Update submodule
2625f13 Fix processHeapClosureForDead CONSTR_NOCAF case
b56926d Refactor floatEqualities slightly
56b9e47 Improve comments about CUSKs
e40eb73 submodule update
2928b92 Comments only
cbd4b33 Bump haskeline submodule to 0.7.4.3
c67cf9e Bump mtl submodule to v2.2.2
b794c7e Bump directory submodule to v1.3.3.0
c3328ff Bump unix submodule
0905fec Remove random submodule
502640c Optimise wakeups for STM
a754a42 Remove ASSERTion about increasing TcLevels
b7d6002 Make some tests robust against DEBUG compiler
fe0fa63 Move check for dcUserTyVarBinders invariant
15ce9b4 Don't mkNakedCastTy on something unsaturated
6d55e36 Disable -fghci-leak-check in DEBUG mode
8a70ccb Reclassify some performance tests
af9b744 Replace atomicModifyMutVar#
9269541 TTG typo: XFieldOcc should be XCFieldOcc
8b6a9e5 Fix parse errors in core-spec.pdf
71f6b18 Fix space leaks
0d6ef6d #15387 Fix setting testsuite verbose to zero
8ec4899 driver: skip -Bsymbolic on unregisterised targets (Trac #15338)
beba89a aclocal.m4: allow riscv and riscv64 CPU
7fe4993 Modernize S_TPush in the core spec
65c186f Do not imply NoStarIsType by TypeOperators/TypeInType
5de8e26 Fix example in `asum` docs
28199a2 Fix hash in haddock of ghc-prim.
c4b8e71 Fixed "Memory Model" example.
3bdf0d0 Support the GHCi debugger with -fexternal-interpreter
5364994 split-obj: disable split-objects on Windows.
973ff4a Fix a typo in related trac ticket number
f20381d Merge branch 'master' into wip/T15050
More information about the ghc-commits
mailing list