[commit: ghc] wip/T2893's head updated: Implement QuantifiedConstraints (50e0984)

git at git.haskell.org git at git.haskell.org
Wed May 23 08:16:20 UTC 2018


Repository : ssh://git@git.haskell.org/ghc

Branch 'wip/T2893' now includes:

     96d2eb2 Invert likeliness when improving conditionals
     1205629 Add likely annotation to cmm files in a few obvious places.
     5e8d314 Update outputs of T12962, scc003
     47031db A bit more tc-tracing
     e7c3878 Move zonkWC to the right place in simplfyInfer
     0f43d0d More tc-tracing
     efba054 Prioritise equalities when solving, incl deriveds
     e9ae0ca Look inside implications in simplifyRule
     55aea8f testsuite: Mark scc001 and T5363 as broken due to #14705
     370b167 circleci: Add Dockerfile for x86_64-linux
     b37dc23 appveyor: Don't install gcc
     fe6fdf6 testsuite: Fix test output of T14715
     7d9812e testsuite: Fix test output broken by efba054640d3
     5f922fb appveyor: Refactor
     0171e09 Make RTS keep less memory (fixes #14702)
     0bff9e6 Don't add targets that can't be found in GHCi
     be84823 Implement BlockArguments (#10843)
     1a911f2 Sequester deriving-related validity check into cond_stdOK
     382c12d rts: Ensure that forkOS releases Task on termination
     add4e1f Mark xmm6 as caller saved in the register allocator for windows.
     e4ab65b Optimize coercionKind (Trac #11735)
     ced9fbd UnboxedTuples can't be used as constraints
     618a805 Experiment with eliminating the younger tyvar
     db5a4b8 Re-center improved perf for T3064
     efce943 Add -ddump-ds-preopt
     e31b41b Flag `-fdefer-typed-holes` also implies `-fdefer-out-of-scope-variables`.
     2974b2b Hoopl.Collections: change right folds to strict left folds
     c3ccd83 testsuite: Fix scc001 profile output
     7fb3287 Add HasDebugCallStack to nameModule
     4f52bc1 DriverPhases: Fix flipped input extensions for cmm and cmmcpp
     3441b14 integer-gmp: Simplify gmp/configure invocation
     fdf518c Upgrade containers submodule
     217e417 ghc-prim: Emulate C11 atomics when not available
     d8a0e6d Don't apply dataToTag's caseRules for data families
     e5d0101 base: Deprecate STM invariant checking primitives
     50adbd7 cmm: Revert more aggressive CBE due to #14226
     606edbf testsuite: Add testcase for #14754
     d987f71 Improve unboxed sum documentation
     326df5d Bump Cabal submodule
     d2511e3 Compute the union of imp_finsts on the side
     7ad72eb cmm: Remove unnecessary HsVersion.h includes
     1512b63 rts: Fix format of failed memory commit message
     4d1c3b7 rts: Add format attribute to barf
     4c36440 Restore 'It is a member of hidden package' message.
     2987b04 Improve X86CodeGen's pprASCII.
     3cd1305 rts: Use BITS_IN macro in bitmap calculations
     00f1a4a rts: fix some barf format specifiers.
     da46813 testsuite: Add test for #14768
     4aa98f4 Fix utterly bogus TagToEnum rule in caseRules
     41d29d5 Comments only
     6506980 Fix solveOneFromTheOther for RecursiveSuperclasses
     be53d19 Use SPDX syntax in rts/package.conf.in
     059596d rts: fix barf format attribute
     6edafe3 Fix isDroppableCt (Trac #14763)
     f489c12 Simplify Foreign.Marshal.Alloc functions with ScopedTypeVariables
     583f561 Evac.c: remove unused CPP guard
     c9a88db Make ($!) representation-polymorphic
     5957405 Collect CCs in CorePrep, including CCs in unfoldings
     0c9777b Fix tests broken by c9a88db3ac4f1c3e97e3492ebe076f2df6463540
     8936ab6 Raise parse error for `data T where`.
     df449e1 Various documentation improvements
     ec9aacf adds -latomic to. ghc-prim
     d5ff33d Adds `smp` flag to rts.cabal.
     e03ca71 Update .cabal files for Cabal 2.1
     0c2350c rts.cabal.in: advertise profiling flavours of libraries, behind a flag
     8529fbb Get eqTypeRep to inline
     7c173b9 Move `iserv` into `utils` and change package name from `iserv-bin` to `iserv`
     d5ac582 Fix #14811 by wiring in $tcUnit#
     a644dff circleci: Add nightly build using devel2 flavour
     9080466 base: Fix changelog entry for openTempFile
     1ede46d Implement stopgap solution for #14728
     918c0b3 Add valid refinement substitution suggestions for typed holes
     9ff4cce Build Haddocks with --quickjump
     bfb90bc Remove doubled words
     ccda486 Tidy up and consolidate canned CmmReg and CmmGlobals
     c05529c myThreadId# is trivial; make it an inline primop
     4e513bf CBE: re-introduce bgamari's fixes
     d924c17 testsuite: Add newline to test output
     fc33f8b Improve error message for UNPACK/strictness annotations.
     7f389a5 StgLint overhaul
     043466b Rename the types in a GADT constructor in toposorted order
     5b63240 Increase the amount of parallelism in circleci.
     9fc4608 Bump haddock submodule again
     2382bbf Bump process submodule
     fc04a8f Bump filepath submodule
     d20524e Bump pretty submodule
     9ad3fa1 Bump stm submodule to 2.4.5.0
     bd0af2a Bump primitive submodule to 0.6.3.0
     e26d774 Bump parsec submodule to 0.3.13.0
     1ee5abc Bump haskeline submodule to 0.7.4.2
     2cb19b4 Bump text submodule to 1.2.3.0
     71294f3 testsuite: Bump allocations for T1969 and T5837
     eb2daa2 Change how includes for input file directory works
     517c194 Document missing dataToTag# . tagToEnum# rule
     81a5e05 circleci: Skip performance tests
     f511bb5 Add ghc-prim.buildinfo to .gitignore
     f433659 Slight refactor of stock deriving internals
     abfe104 Revert "Move `iserv` into `utils` and change package name
     a032ff7 Add references to #6087
     0a3629a Don't use ld.gold when building libraries for GHCi
     3483423 Comments in Unify, fixing #12442
     bf3f0a6 Update Hadrian submodule
     c969c98 driver/utils/dynwrapper.c: Remove unused variable
     be498a2 RTS: Remember to free some pointers
     cb89ba8 RTS: Remove unused retainer schemes
     3d43fd5 Introduce the flag -dsuppress-timestamps to avoid timestamps in dumps.
     5e5e60d boot: Create GNUmakefiles for libraries
     f57c305 testsuite: Bump allocations for T9630
     ffdb110 Update .gitignore
     da4766c circleci: Simplify Hadrian build
     8c1d6b7 Tiny refactor in Core Lint
     40fa420 Comments only
     e99fdf7 Fix a nasty bug in the pure unifier
     d675a35 Better stats for T5837
     3dec923 Test for Trac #13075 is working now
     51e0a38 Comments only
     b2996f1 Fix test for Trac #13075
     df2c3b3 Build quick flavor and run some tests on Windows
     2756117 Revert "Better stats for T5837"
     b8f03bb Cache the fingerprint of sOpt_P
     e261b85 forkProcess: fix task mutex release order
     8dab89b rts: Note functions which must take all_tasks_mutex.
     f8e3cd3 Only load plugins once
     d8e47a2 Make cost centre symbol names deterministic.
     8c7a155 Move Data.Functor.Contravariant from the contravariant package to base.
     e8e9f6a Improve exhaustive checking for guards in pattern bindings and MultiIf.
     125d151 Add regression test for #12790
     aef2b42 Fix #14817 by not double-printing data family instance kind signatures
     4a0d0d8 Various Windows / Cross Compile to Windows fixes
     1773964 DynFlags: Support British spelling of GeneralisedNewtypeDeriving
     969e747 GHCi info: Use src file for cache invalidation
     6a7e159 Improve missing-home-modules warning formatting
     5c28ee8 Add @since annotations for derived instances in base
     6e4fa81 rts/win32: Assert that the IO manager has been initialised
     bc1bcaa configure: Enable LD_NO_GOLD is set in all codepaths
     7782b47 Add Applicative, Semigroup, and Monoid instances in GHC.Generics
     e4dcebf Adds *-cross-ncg flavour.
     6835702 Permit conversion of partially applied PromotedTupleTs
     ffb2738 Fix #14838 by marking TH-spliced code as FromSource
     5f6fcf7 Compile with `--via-asm` when cross compiling.
     44ba60f doCorePass: Expand catch-all
     821daad Correct default -A value in RTS flag usage info
     a2d03c6 Fix the coverage checker's treatment of existential tyvars
     99c556d Parenthesize (() :: Constraint) in argument position
     4631ceb Bump hsc2hs submodule
     8f0b2f5 Bump Cabal submodule to 2.2
     a9f680f Bump Cabal submodule
     e7653bc Wombling around in Trac #14808
     3d25203 Respect Note [The tcType invariant]
     6ee831f Fix #14888 by adding more special cases for ArrowT
     1c062b7 Simplify rnLHsInstType
     df7ac37 Fixup include of gmp/config.mk to use new location
     f6cf400 `--via-asm` only for windows targets
     cf5bc96 add CCX=$(CXX) to integer-gmp
     ee597e9 Schedule.c: remove a redundant CPP guard
     5bc195a Allow top level ticked string literals
     9bccfcd Correct -g flag description
     64c0af7 cmm/: Avoid using lazy left folds
     08345bd Make accumArray and accum stricter
     1488591 Bump nofib submodule
     488d63d Fix interpreter with profiling
     40c4313 Add perf test for #14052
     b120e64 Add bindist-list.uniq to .gitignore
     d9d4632 Schedule.c: remove unreachable code block
     648cb28 Use docker images with non-root user
     b320ba8 Fix a typo about pattern synonyms in documentation.
     b3bfbed Users Guide: Add that --numa is available on Windows too
     43fbb90 Fix typo in description of -V RTS flag
     d99a65a Add -fexternal-dynamic-refs
     98c7749 Revert "GHCi: Don't remove shadowed bindings from typechecker scope."
     bc95fed Error message and doc improvements for #14335
     ed6f9fb ghc-prim: Reduce scope of Clang sync_fetch_and_nand workaround
     94f0254 ghc-prim: Silence -Wsync-nand warning in atomic.c
     47e2a28 Remove outdated documentation bits concerning -Wmissing-methods
     a25b763 configure: Accept suffix in OpenBSD triple's OS name
     df2ea10 Compacted arrays are pinned for isByteArrayPinned#
     dd3906b UNREG: fix implicit declarations from pdep and pext
     8e34101 Fix a debug print in disassembler (#14905)
     e3ae0eb testsuite: disable T13615 on non-smp targets
     5c804e5 Remove splitEithers, use partitionEithers from base
     02b3dad Bump Cabal submodule
     50972d6 Comment improvements on interpreter breakpoint IO action
     ba57979 Update a comment in Exception.cmm
     152055a Drop GHC 8.0 compatibility
     cb6d858 Slighly improve infix con app pattern errors
     1522cf0 aclocal.m4: allow more GNU/Hurd tuples
     0693b0b aclocal.m4: add OSHurd (debian patch)
     2a3702d Comments and tiny refactor
     5a1ad23 Update test for #5129:
     f9a6d42 Add a build with 32bit Ubuntu container
     2918abf rts: Add --internal-counters RTS flag and several counters
     3d378d9 Also check local rules with -frules-check
     39c7406 Be more selective in which conditionals we invert
     fad822e Improve the warning message of qualified unused imports.
     0db0e46 Get rid of more CPP in cmm/ and codeGen/
     bbcea13 Hoopl: improve postorder calculation
     a00b88b Implement -dword-hex-literals
     b37a87b PPC nativeGen: Add support for MO_SS_Conv_W32_W64
     5241f29 SPARC nativeGen: Support for MO_SS_Conv_W32_W64
     d27336e [RFC] nativeGen: Add support for MO_SS_Conv_W32_W64 on i386
     20cbb01 Improve accuracy of get/setAllocationCounter
     256577f CmmUtils: get rid of insertBlock
     fbd9b88 Implement equalKeysUFM the right way
     9868f91 Turn a TH Name for built-in syntax into an unqualified RdrName
     e358854 Require GHC 8.2 to bootstrap GHC
     c3aea39 Fix #14934 by including axSub0R in typeNatCoAxiomRules
     f748c52 Don't permit data types with return kind Constraint
     fdec06a Update tests for #12870 to pass with a slow run of the testsuite.
     98c1f22 Bump array submodule
     960cd42 Fix typo in user guide about ConstraintKinds
     82e8d1f Fix typo
     b3b394b gen-data-layout.sh: Use bash array for readability
     2d4bda2 rts, base: Refactor stats.c to improve --machine-readable report
     afad556 Add -flate-specialise which runs a later specialisation pass
     6a71ef7 Bump autoconf version bound to >= 2.69
     d718023 relnotes: Fix parsing of Version: field from Cabal file
     60aa53d configure: Accept version suffix in solaris name
     57001d9 Update T5129 test:
     0a778eb Revert "rts, base: Refactor stats.c to improve --machine-readable report"
     abaf43d Fix seq# case of exprOkForSpeculation
     49ac3f0 Fix #14869 by being more mindful of Type vs. Constraint
     411a97e Allow as-patterns in unidirectional patttern synonyms
     3446cee Fix two obscure bugs in rule matching
     efc844f Fix over-eager constant folding in bitInteger
     034c32f Improve shortOutIndirections slightly
     d5577f4 Special-case record fields ending with hash when deriving Read
     affdea8 Allow PartialTypeSignatures in standalone deriving contexts
     ceb9147 Support adding objects from TH
     7bb1fde testsuite: Add test for #14931
     10566a8 Support iOS variants elsewhere when configuring
     9893042 Fix two pernicious bugs in DeriveAnyClass
     cf80995 Add Note [BLACKHOLE points to IND]
     f7bbc34 Run C finalizers incrementally during mutation
     fb462f9 Fix panic on module re-exports of DuplicateRcordFields
     c16df60 document: fix trac issue #14229
     9a00bfb rts/RetainerProfile: Dump closure type if push() fails
     0703c00 testsuite: Add test for #14925
     20f14b4 Fix #14916 with an additional validity check in deriveTyData
     0cbb13b Don't refer to blocks in debug info when -g1
     a3986d7 Fix scoped type variables in TH for several constructs
     41db237 llvmGen: Pass -optlo flags last to opt
     20ae19f base: Fix Unicode handling of TyCon's Show instance
     ecfb4d3 Add new debugging flag -dinline-check
     efd70cf Add unaligned bytearray access primops. Fixes #4442.
     d152dab Add a job running on Fedora
     60e29dc circleci: Bump Hackage index state
     f0b258b rts, base: Refactor stats.c to improve --machine-readable report
     41c1558 Make it evident in types that StgLam can't have empty args
     97e1f30 Fix compilation stopper on macOS with -Werror
     e3dbb44 Fix #12919 by making the flattener homegeneous.
     b47a6c3 Fix performance of flattener patch (#12919)
     f13a0fc Comments only
     1fce2c3 Avoid quadratic complexity in typeKind
     71d50db Minor refactor and commments
     9cc6a18 White space only
     a7628dc Deal with join points with RULES
     3ebf05f Fix the test for #13938
     8cfd2e4 configure: Throw error if OS is found to be msys
     d5c4d46 CmmPipeline: add a second pass of CmmCommonBlockElim
     d1fb583 testsuite: Add test for #14965
     ab9e986 rts: Fix profiled build after D4529
     b58282a More format string fixes
     88f06d4 rts: One last formatting string fix
     bf2b9cc Update Note [Documenting optimisation flags]
     d06a5a9 Rename CI docker images
     0951e03 Full AppVeyor build with tests
     0017a7b Fix syntax in -flate-specialise docs
     c00b6d2 Update a few comments regarding CAF lists
     afb686a printClosure: slightly improve MVAR printing
     4de585a Remove MAX_PATH restrictions from RTS, I/O manager and various utilities
     ca535f9 testsuite: allow accepting of fine grained results [skip ci]
     faec8d3 Track type variable scope more carefully.
     ef44382 Apply the interim fix for #14119 to liftCoMatch
     3eaa55d Apply Note [EtaAppCo] in OptCoercion to another case
     1845d1b Clarify comments around dropping Derived constraints
     07abff7 Test #14884, #14969
     9187d5f Allow unpacking of single-data-con GADTs
     5ab8094 SpecConstr: accommodate casts in value arguments
     ddf8955 Mark test as expected to pass.
     d8d4266 Fix #14991.
     72b5f64 Fix accidental breakage in T7050
     c2f90c8 Remove unused bdescr flag BF_FREE
     891ffd5 Comments only, about exitifcation
     54acfbb base: Add dependency on GHC.Integer in a few boot files
     875e59d testsuite: Accept output for T12593
     718a018 Fix #14238 by always pretty-printing visible tyvars
     5819ae2 Remove HasSourceText and SourceTextX classes
     d386cd6 Collect build artifacts with S3
     26cfe29 Document SumTyCon
     7bd7fec Improve documentation for refineDefaultAlt
     605ae8d Run tests after artifact collection
     a5bfb7e CoreUtils.filterAlts: Correct docs
     8b823f2 docs(Data.Function): fix and augment `on` annotation
     b14c037 Some cleanup of the Exitification code
     48f55e7 Bump template-haskell to 2.14.0.0
     1aa1d40 Restore Trees That Grow reverted commits
     ae0cff0 CSE: Walk past join point lambdas (#15002)
     a1fcdf3 Add a forgotten newline in a debug print
     b2eb9ad Fix GHC collector flavor for Fedora job (Circle CI)
     3f59d38 Add test case for #15005
     635a784 Remove PARALLEL_HASKELL comments
     5161609 testsuite: Add test for negative sqrts (#10010)
     d5f6d7a rts/RetainerProfile: Handle BLOCKING_QUEUES
     81e7980 Minor typofix in LoadArchive.c
     2534164 Move gmp/config.mk.in to config.mk.in, fix #14972
     c054162 Revert "Fix #14838 by marking TH-spliced code as FromSource"
     7bb7f99 Discard reflexive casts during Simplify
     3cfb12d In Exitify, zap idInfo of abstracted variables (fixes #15005)
     a323f21 Move T14925.stdout to its correct location, remove expect_broken
     ed57a34 Schedule.c: remove unused code
     74e768e Schedule.c: remove some unused parameters
     270e3e9 No need for sortQuantVars in Exitify after all
     111556f Remove fs files from rts install-includes.
     4e6da0f Revert "Remove fs files from rts install-includes."
     5417c68 Remove fs files from rts install-includes.
     b138694 TTG for HsBinds and Data instances Plan B
     c4814ab Bump version numbers: base-4.11.1.0, integer-gmp-1.0.2.0
     f02309f users-guide: Update release notes and language extensions
     78ff6e5 Revert "CmmPipeline: add a second pass of CmmCommonBlockElim"
     a303584 Fix processHeapClosureForDead CONSTR_NOCAF case:
     120a261 Update JMP_TBL targets during shortcutting in X86 NCG.
     f78df87 Fix rts.cabal.in
     6f62303 Remove unused function: mkFunCos
     7613a81 Fix #9438 by converting a panic to an error message
     6a78a40 Use newtype deriving for Hoopl code
     9430901 Revert "Fix processHeapClosureForDead CONSTR_NOCAF case:"
     ce27c7d Correct FixIOException's @since annotation retroactively
     00b8ecb Declare `catchRetry#` lazy in its first argument
     3c7f9e7 Make shortcutting at the asm stage toggleable and default for O2.
     9e89092 Omit ways depending on rts flags for #12870 related tests.
     4b831c2 Configure option to disable dtrace
     fea04de Enhanced constant folding
     09128f3 users guide: Note improved constant folding in 8.6 release notes
     0e37361 Revert "Enhanced constant folding"
     90283b5 rts: Comment wibbles
     4d30bc8 Remove markSignalHandlers
     7889659 Minor comments in CSE
     fe325d3 Comments only
     4a16804 Fix markup in the UNPACK pragma section of the user's guide.
     cab3e6b Proper safe coercions paper link
     5d76846 Introduce a $tooldir variable for nicer toolchain detection on Windows
     447d126 Fix #14710 with more validity checks during renaming
     2fdfe05 Bump unix submodule to version 2.8.0.0
     19ddd04 Add a test case from the nested CPR work
     803178a users-guide: Override mathjax_path
     48b8842 rts: fix format arguments for debugBelch calls on 32-bit systems
     f7f567d Add a test for #14815:
     cac8be6 Better error message for empty character literal, for Trac #13450.
     b08a6d7 Fix #15012 with a well-placed use of Any
     8f19ecc Bump base to version 4.12.0.0
     d9d8015 testsuite: Fix `./validate --slow`
     3c3e731 parsec: Make version hack compatible with Windows
     cbd73bb configure: Use -Werror to check for existence of -no-pie
     8fa688a boot: Fix computation of TOP
     257c13d Lint types in newFamInst
     a26983a Fixes isAlphaNum re. isAlpha/isNumber and doc fix (trac issue #10412)
     b41a42e Bump transformers submodule
     2fbe0b5 Caching coercion roles in NthCo and coercionKindsRole refactoring
     8b10b89 Inline wrappers earlier
     f6db0b2 comments only
     430e6fe Remove broken top-level shell.nix
     698db813 Fix implementation of rnIfaceBndr
     da74385 base: Add a test for T10412
     2a5bdd9 Remove unnecessary check in simplCast
     98b0c3f s/traverse_weak_ptr_list/traverseWeakPtrList in comments [skip ci]
     ea01daf rts: Use g0 for &generations[0]
     c7c53c6 Remove a outdated comment [skip ci]
     bfc1fc2 Typo fix in scavenge_one comment [skip ci]
     f19b07a users-guide: Fix up formatting in 8.6 release notes
     2eafd76 coercion: Improve debugging output
     f04ac4d Add testcase for #15050
     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
     50e0984 Implement QuantifiedConstraints


More information about the ghc-commits mailing list