[commit: ghc] wip/T14068's head updated: Implement loopification for local bindings (#14068) (8469ddd)

git at git.haskell.org git at git.haskell.org
Tue Oct 31 03:35:02 UTC 2017


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

Branch 'wip/T14068' now includes:

     c13720c Drop GHC 7.10 compatibility
     36fe21a Enable building Cabal with parsec
     9df71bf Bump unix submodule
     8ef8520 Add .gitmodules entries for text, parsec, mtl submodules
     d74983e Get the roles right for newtype instances
     f68a00c Remove unneeded uses of ImplicitParams
     884bd21 Add the bootstrapping/ dir to .gitignore
     394c391 Add MonadIO Q - by requiring MonadIO => Quasi
     a81b5b0 Remove the deprecated Typeable{1..7} type synonyms
     a267580 Don't warn when empty casing on Type
     6ea13e9 Add forgotten > in Control.Applicative
     e8fe12f Fix string escaping in JSON
     2f29f19 Convert examples to doctests, and add a handful of new ones
     14457cf Fix EmptyCase documentation
     a4f347c Split out inferConstraintsDataConArgs from inferConstraints
     3f05e5f Don't suppress unimplemented type family warnings with DeriveAnyClass
     7d69978 Use NonEmpty lists to represent lists of duplicate elements
     4f1f986 Change isClosedAlgType to be TYPE-aware, and rename it to pmIsClosedType
     0bb1e84 Expand type synonyms during role inference
     c6462ab Add test for #14101
     7c37ffe Point to FunDeps documentation on Haskell wiki
     ad7b945 Fix #14060 by more conservatively annotating TH-reified types
     0a891c8 Properly handle dlerror() message on FreeBSD when linking linker scripts
     ddb870b Don't drop GHCi-defined functions with -fobject-code enabled
     ed7a830 Use a ReaderT in TcDeriv to avoid some tedious plumbing
     21bd9b2 Recognize FreeBSD compiler as Clang.
     a520adc Bump mtl, parsec, text submodules
     441c52d Add Semigroup/Monoid instances to ST monad
     b0285d1 Bump nofib submodule
     e054c5f Bump mtl, parsec, text submodules
     6e9c8eb Bump mtl, parsec, text submodules (again)
     a8da0de Speed up compilation of profiling stubs
     b0ed07f Allow TcDerivInfer to compile with GHC 8.0.1
     38260a9 Fix #13972 by producing tidier errors
     039fa1b Suggest how to fix illegally nested foralls in GADT constructor type signatures
     c948b78 Fix #11785 by making reifyKind = reifyType
     af9f3fa Remove extra ` from "kind-indexed GADTs" doc
     03327bf Handle ListPat in isStrictPattern
     36d1b08 Doctest for Void.absurd
     49ddea9 Sections with undefined operators have non-standard behavior
     43b0c2c Insert missing blank line to fix Applicative doc
     63397cb Add some Monoid doctests
     f762181 Mention the category laws explicitly
     a30187d Convert documentation examples to doctests for ReadP module
     bfa9048 Loads of doc(test)s
     2c0ab47 Add missing initial version for extension doc.
     0e1b6f8 Fix index entries in "separate compilation" section
     3385669 user-guide: fix examples of ghci commands
     69a0f01 rts: Enable USDT probes object on Linux
     82ee71f user-guide: add `:type +d` and `:type +v` in release highlight
     dc42c0d Fix #13399 by documenting higher-rank kinds.
     0385347 Remove unneeded reqlibs for mtl and parsec in the GHC testsuite
     c5605ae Make function intToSBigNat# preserve sign (fixes #14085)
     0286214 testsuite: Add test for #13916
     fee253f CSE.cseOneExpr: Set InScopeSet correctly
     6257fb5 Comments about GlobalRdrEnv shadowing
     118efb0 Restrict Lint's complaints about recursive INLINEs somewhat
     698adb5 Tracing in OccAnal (commented out)
     4c6fcd7 Comments only
     61c4246 Test Trac #14110
     f50e30e Doctests for Data.Tuple
     6267d8c Enable -Wcpp-undef for GHC and runtime system
     cf8ab1c users_guide: Convert mkUserGuidePart generation to a Sphinx extension
     8e5b6ec Add strict variant of iterate
     ee2e9ec Correct incorrect free in PE linker
     1cdceb9 Revert "Add strict variant of iterate"
     34bd43d Fix loading of dlls on 32bit windows
     6982ee9 Fix #14125 by normalizing data family instances more aggressively
     a89bb80 Fix #14114 by checking for duplicate vars on pattern synonym RHSes
     79b259a Fix #13885 by freshening reified GADT constructors' universal tyvars
     8476097 Revise function arity mismatch errors involving TypeApplications
     8fd9599 Make the Read instance for Proxy (and friends) ignore precedence
     afc2f79 Move validate cleaning from distclean to clean
     4717ce8 Fix incorrect retypecheck loop in -j (#14075)
     9afaebe StgLint: Allow join point bindings of unlifted type
     cd5a970 Make law for Foldable.length explicit
     20c7053 Bump haddock submodule
     090d896 fix typo (expreesions -> expressions)
     028645c Fixed a typo in template-haskell documentation
     dbaa9a2 DynFlags: Add inverse of -dno-debug-output
     3625728 Add support for producing position-independent executables
     7463a95 users-guide: Better error messages on incomplete ghc-flag directives
     74af2e7 Typo fixed
     11657c4 Better pretty-printing for CHoleCan
     a211dca Fix defer-out-of-scope-variables
     aeb4bd9 Remove typeKind from Type.hs-boot
     5f3d2d3 CNF: Implement compaction for small pointer arrays
     a0b7b10 Restrict exprOkForSpeculation/case to unlifted types
     407c11b Bottoming expressions should not be expandable
     33452df Refactor the Mighty Simplifier
     8649535 Don't do the RhsCtxt thing for join points
     dd89a13 Comments, plus adjust debug print of TcTyThing(ATyVar)
     a67b66e Add strict variant of iterate
     f135fb2 rts: Fix warnings on aarch64 and clean up style
     80ccea8 rts: Fix references to Note [BFD import library]
     76e59a2 rts: Fix ASSERTs with space before opening paren
     8f19c65 Rip out mkUserGuidePart
     83484a6 Fix two typos in the ImpredicativeTypes user guide
     a055f24 Adjust test suite stats
     682e8e6 Actually bump T12150
     29da01e Make parsed AST dump output lazily
     6e0e0b0 Comments only
     8834d48 Better debug-printing for Outputable TyConBinder
     547e4c0 A bit more -ddump-tc tracing
     6f050d9 Add TcRnMonad.unlessXOptM
     0257dac Refactor bindHsQTyVars and friends
     86e6a5f Small refactoring of meta-tyvar cloning
     4455c86 Use a well-kinded substitution to instantiate
     8eead4d Improve kind-application-error message
     a6c448b Small refactor of getRuntimeRep
     aed7d43 Add HasDebugStack for typeKind
     248ad30 testsuite: Add test for #14128
     db3a8e1 desugar: Ensure that a module's dep_orphs doesn't contain itself
     5266ab9 Remove dll-split.
     895a765 Refactor type family instance abstract syntax declarations
     3c6b2fc Fix decomposition error on Windows
     5f6a820 Add gen-dll as replacement for dll-split
     f86de44 ghc-pkg: Try opening lockfiles in read-write mode first
     a27bb1b base: Add support for file unlocking
     779b9e6 PackageDb: Explicitly unlock package database before closing
     9d57d8c nativeGen: Don't index into linked lists
     651b4dc StgLint: Show type of out-of-scope binders
     a36b34c StgLint: Enforce MultiValAlt liveness invariant only after unariser
     f17f106 StgLint: Give up on trying to compare types
     1561525 HsExpr: Fix typo
     6f1ccaa Add a Note describing #14128
     567dca6 Add some traceRn and (Outputable StmtTree)
     628b666 Add comments to RnTypes
     fca1962 Define and use HsArg
     805b29b Add debugPprType
     3790ea9 Small changes to ddump-tc tracing
     2c133b6 Really fix Trac #14158
     c0feee9 Add missing Semigroup instances to compiler
     b2c2e3e Add missing Semigroup instances in utils/{hpc,runghc}
     dd643bc Improve stm haddocks
     1f052c5 Fix order of PrelRule
     8a1de42 Add testcase for #14178
     f089c32 Remove broken citeseer citation links
     590e737 Update transformers submodule
     6330b0b Document the intricacies of ForallC variable quantification better
     5dd6b13 Disallow bang/lazy patterns in the RHSes of implicitly bidirectional patsyns
     8e4229a Fix #14167 by using isGadtSyntaxTyCon in more places
     0ec4376 Document the Generic(1) laws
     cb3363e Move NonEmpty definition into GHC.Base
     31281a4 testsuite: Fix validation of ways
     b996e12 testsuite: Add test for #14129
     7e5d4a0 Remember the AvailInfo for each IE
     b9ac9e0 Fix egregious duplication of vars in RnTypes
     1300afa get-win32-tarballs: Use bash, not sh
     a4c2ac2 get-win32-tarballs: Use correct `find`
     542f89f Replace hashing function for string keys implementation with xxhash
     cd857dd SetLevels: Substitute in ticks in lvlMFE
     6458b8d base: Update acosh to handle -1::Complex
     c2881a2 StgLint: Show constructor arity in mismatch message
     822abbb eventlog: Clean up profiling heap breakdown type
     24e50f9 rts: Add heap breakdown type for -hT
     0829821 Implicitly bind kind variables in type family instance RHSes when it's sensible
     0cd467b rts: Fix use of #if
     2273353 Clean up opt and llc
     c6726d6 Cleanups, remove commented-out code
     a04cfcf Update xhtml submodule
     fee403f Handle W80 in floatFormat
     d97a6fe Fix typos in diagnostics, testsuite and comments
     055d73c Travis: Boot with ghc-8.2.1, and disable test suite
     8ae263c Make Semigroup a superclass of Monoid (re #14191)
     be514a6 includes/rts: Drop trailing comma
     cb4878f Drop special handling of iOS and Android
     011e15a Deal with unbreakable blocks in Applicative Do
     22f11f1 Bump T783 expected allocations
     cf6b4d1 Remove now redundant CPP
     122f183 Remove now redundant cabal conditionals in {ghc,template-haskell}.cabal
     400ead8 Remove makefile logic for legacy -this-package-key
     dab0e51 Canonicalise Monoid instances in GHC
     346e562 Canonicalise MonoidFail instances in GHC
     838a10f Retire cabal_macros_boot.h hack
     fe35b85 Add testcase for #14186
     fe04f37 Allow CSE'ing of work-wrapped bindings (#14186)
     0ebc8dc Add a test for #14140
     9ff9c35 Check if -XStaticPointers is enabled when renaming static expressions
     dafa012 Add regression test for #14209
     b890e88 rts: Print message before SIGUSR2 backtrace
     d645e44 DriverMkDepend: Kill redundant import
     f8e383f Clarify Data.Data documentation
     91262e7 Use ar for -staticlib
     e62391a [RTS] Harden against buffer overflow
     cbd4911 Make IntPtr and WordPtr as instance of Data.Data typeclass, fix #13115
     8ff11c4 Fix @since annotations in GHC.Stats
     6139f7f Add non-ASCII isLetter True example
     2fe6f6b Option "-ddump-rn-ast" dumps imports and exports too
     f9bf621 Better document TypeRep patterns
     4be195e Simplify Data.Type.Equality.==
     4e22220 Clarify seq documentation
     4cead3c rts: Add regsterCc(s)List to RTS symbols list
     10a1a47 Model divergence of retry# as ThrowsExn, not Diverges
     959a623 No need to check ambiguity for visible type args
     ab2d3d5 More refinements to debugPprType
     3a27e34 Fix subtle bug in TcTyClsDecls.mkGADTVars
     8bf865d Tidying could cause ill-kinded types
     0390e4a Refactor to eliminate FamTyConShape
     a38acda Refactor tcInferApps
     9218ea6 Interim fix for a nasty type-matching bug
     9e46167 Remove unused variable binding
     b6b56dd [RTS] Make -po work
     93da9f9 Add test for Trac #14232
     3b68687 Test #14038 in dependent/should_compile/T14038
     c813d8c Regression test for #12742
     b977630 Test #12938 in indexed-types/should_compile/T12938
     04bb873 Fix #13407 by suppressing invisibles better.
     ecb316c nativeGen: A few strictness fixes
     58f1f73 Bump primitive submodule
     3edbf5c testsuite: Fix dependence on grep behavior in T8129
     89c8d4d Fix #13909 by tweaking an error message.
     e5beb6e Make rejigConRes do kind substitutions
     fa626f3 Fix #13929 by adding another levity polymorphism check
     86e1db7 Test #13938, with expect_broken
     8f99cd6 Fix #13963.
     7b8827a Bump submodule nofib (Semigroup now required)
     f043cd5 Fix name of note
     4340165 Ignore untracked in text, parsec and mtl submodules [skip ci]
     9e227bb Fix missing fields warnings in empty record construction, fix #13870
     f4d50a0 Fix #14228 by marking SumPats as non-irrefutable
     2bfba9e base: Fix mixed tabs/spaces indentation in inputReady.c
     9498c50 Renamer now preserves location for IEThingWith list items
     47a9ec7 Remove dead function TcUnify.wrapFunResCoercion
     b099171 base: Enable TypeInType in Data.Type.Equality
     4ec4ca9 base: Add missing MonadFail instance for strict ST
     60a3f11 Fix pointer tagging mistake
     a83f17e base: Fix missing import of Control.Monad.Fail
     2258a29 testsuite: Fix MonadFail test output for new ST instance
     cdaf5f2 [RTS] Add getObjectLoadStatus
     120c568 Allow opt+llc from LLVM5
     10ca801 Generalise constraint on `instance Monoid (Maybe a)` to Semigroup
     a2f004b Remove redundant/obsolete CPP usage
     1db0f4a Fix unused-given-constraint bug
     6252292 rts/RetainerProfile: Adding missing closure types to isRetainer
     8b007ab nativeGen: Consistently use blockLbl to generate CLabels from BlockIds
     12a92fe OccurAnal: Ensure SourceNotes don't interfere with join-point analysis
     f63bc73 compiler: introduce custom "GhcPrelude" Prelude
     7c7914d Fix Windows build regression due to GhcPrelude change
     28a115e base: fdReady(): Improve accuracy and simplify code.
     c2a1fa7 base: Fix fdReady() potentially running forever on Windows.
     826c3b1 base: Fix fdReady() potentially running forever for Windows Char devices.
     66240c9 base: Fix fdReady() returning immediately for pipes on Windows.
     11c478b rts: Update comment about FreeBSD's unsigned FD_SETSIZE
     b7f2d12 rts: Fix typo in comment
     ba4dcc7 base: Make it less likely for fdReady() to fail on Windows sockets.
     022455f base: Add more detail to FD_SETSIZE related error message
     bbb8cb9 users-guide: Mention changes necessary due to #13391
     3198956 Factor mkCoreApp and mkCoreApps
     7920a7d cmm/CBE: Collapse blocks equivalent up to alpha renaming of local registers
     0aba999 Restore function powModSecInteger
     11d9615 Make zipWith and zipWith3 inlinable.
     02ff705 Add 'stm' package to the global package database
     d7705f2 aclocal.m4: call cygpath on mingw32 only
     ced2cb5 Typofixes (visiblity -> visibility)
     283eb1a Initial CircleCI support.
     cc6be3a Typeable: Allow App to match arrow types
     9e46d88 Typeable: Generalize kind of represented type
     72b00c3 Identify fields by selector when type-checking (fixes #13644)
     acd346e testsuite: Add testcase for #14253
     d86b237 testsuite: Add unboxed sum to T13929
     58a7062 base: Add changelog entry for withTypeable generalization
     063e0b4 Bump base to 4.11.0.0
     1c92083 Also show types that subsume a hole as valid substitutions for that hole.
     ddb38b5 testsuite: Bump allocations of T12150
     9aa7389 cmm/CBE: Use foldLocalRegsDefd
     feac0a3 Reexport Semigroup's <> operator from Prelude (#14191)
     760b9a3 rts: Set unwind information for remaining stack frames
     a9d417d rts: Set unwind information for catch_frame
     1755869 Implement TH addCorePlugin.
     d7b8da1 Fix broken LLVM code gen
     5a8b843 Remove 'stm' from EXTRA_PACKAGES set
     2f10438 Fix build with GhcWithInterpreter=NO
     65943a3 Bump haskeline submodule
     c2373b7 Additional LLVM_TARGET logic.
     d559612 Fix AsmTempLabel
     d7b260f [Semigroup] fix genapply
     9c7d065 Revert "Typeable: Allow App to match arrow types"
     b3ae47c don't allow AsmTempLabel in UNREG mode (Trac #14264)
     3c74a51 Deal with large extra-contraints wildcards
     7721e8e Make pprQuotedList use fsep not hsep
     3b4833a Comments only
     1b476ab Improve type-error reporting
     abed9bf Fix solving of implicit parameter constraints
     0e60cc1 Document how GHC disambiguates between multiple COMPLETE sets
     3804a7e Bump template-haskell to 2.13.0.0
     2b2595e Ensure text mode when calling debug functions
     c839c57 Fix the searching of target AR tool
     abca29f Adds mingw64 to the valid GHC OSs.
     6de1a5a Document Typeable's treatment of kind polymorphic tycons
     d07b8c7 Include original process name in worker thread name (#14153)
     9acbeb5 integer-gmp: Fix style
     d11611f Add NOINLINE pragma to builtinRules
     9738e8b Use SIGQUIT for DWARF backtraces instead of SIGUSR2
     49c1a20 configure: Catch case where LLVM tools can't be found
     65f7d87 configure: Don't hard-code strip tool
     2f8e6e7 testsuite: Expect T13168 to be broken on Windows
     7446c7f A bunch of typofixes
     c41ccbf Omit Typeable from the "naturally coherent" list
     6e7c09d StgCmmMonad: Remove unnecessary use of unboxed tuples
     6246407 primops: Add some notes regarding the meaning of the "type" field
     1d1b991 rts: Inform kernel that we won't need reserved address space
     57372a7 PrelRules: Handle Int left shifts of more than word-size bits
     0ffa396 testsuite: Add test for #14272
     f9f1e38 TcInteract: Remove redundant import of Typeable
     3ec579d Release console for ghci wrapper
     8c23b54 Rules: Show the binder type in the unbound template binder error
     7fb89e8 rts: Silence missing __noreturn__ warning
     1825cbd Switch VEH to VCH and allow disabling of SEH completely.
     8f468fe base: fdReady(): Add note about O_NONBLOCK requirement
     018c40f desugar: Catch levity polymorphism in unboxed sum expressions
     30a1eee rts: Throw proper HeapOverflow exception on allocating large array
     47888fd Revert "Switch VEH to VCH and allow disabling of SEH completely."
     1421d87 Switch VEH to VCH and allow disabling of SEH completely.
     07ddeaf GHC_LLVM_TARGET: Keep android OS
     60b0645 llvm-targets: drop soft-float
     4364f1e Typofixes
     1e9f90a Move check-ppr and check-api-annotations to testsuite/utils
     9bf6310 Add TODO about getMonotonicNSec() wrapping that can no longer happen.
     dddef31 fdReady(): Fix some C -Wconversion warnings.
     03009aa base: fdReady(): Ensure and doc that return values are always -1/0/1
     a10729f configure: Make sure we try all possible linkers
     5935acd mkDataConRep: fix bug in strictness signature (#14290)
     7aa000b Fix #13391 by checking for kind-GADTs
     464396d Fix Raspberry Pi target name
     9c05fc4 user-guide: Document -Weverything
     626f045 Document a law for TH's Lift class
     effcd56 Don't use "character" in haddocks of Char
     c15c427 iserv: Don't build vanilla iserv unless vanilla libraries are built
     e515c7f Allow libffi snapshots
     e299121 Bump submodule nofib again (Semigroup now required)
     00ff023 Travis: Install texinfo
     11a59de CircleCI: Install texinfo
     0e96812 Pretty-printer missing parens for infix class declaration
     c0e6c73 Rewrite boot in Python
     e30d9ca rel-notes: Mention libffi packaging change
     e462b65 Bump libffi-tarballs submodule
     d5e60de user-guide: Fix :since: annotation of -pie and add documentation for -fPIE
     d0c5d8d No libffi docs
     a4ee289 Adds x86 NONE relocation type
     a1fc7ce Comments only
     a8fde18 Fix bug in the short-cut solver
     b1e0c65 Make GHC.IO.Buffer.summaryBuffer strict
     dbbee1b Fix nasty bug in w/w for absence analysis
     cb76754 Suppress error cascade in record fields
     a02039c Add regression test for #9725
     a36eea1 Revert installing texinfo in CI systems
     55001c0 Sync base/changelog.md
     ec9ac20 Add ability to produce crash dumps on Windows
     8d64745 Optimize linker by minimizing calls to tryGCC to avoid fork/exec overhead.
     ef26182 Track the order of user-written tyvars in DataCon
     fa8035e Implement Div, Mod, and Log for type-level nats.
     377d5a2 base: Add missing @since annotations in GHC.TypeNats
     de1b802 genapply: Explicitly specify arguments
     f3f624a Include libraries which fill holes as deps when linking.
     4899a86 Don't pass HscEnv to functions in the Hsc monad
     361af62 base: Remove deprecated Chan combinators
     3201d85 user-guide: Mention COMPLETE pragma in release notes
     3030eee rts: Print newline after "Stack trace:" on barf
     7109fa8 configure: Accept *-msys as a Windows OS in a triple
     d8d87fa Remove m_type from Match (#14313)
     429fafb Add regression test for #14326
     f6bca0c Testsuite update following d8d87fa
     341d3a7 Incorporate changes from #11721 into Template Haskell
     f1d2db6 Fix #14320 by looking through HsParTy in more places
     f337a20 Simply Data instance context for AmbiguousFieldOcc
     e51e565 Split SysTools up some
     7720c29 Tidy up some convoluted "child/parent" code
     ab1a7583 Typos in comments only
     461c831 Minor refactoring
     c81f66c Fix over-eager error suppression in TcErrors
     79ae03a Change "cobox" to "co" in debug output
     3e44562 Delete two unused functions
     f20cf98 Remove wc_insol from WantedConstraints
     9c3f731 Fix #10816 by renaming FixitySigs more consistently
     6869864 Pretty-printing of derived multi-parameter classes omits parentheses
     4bb54a4 Avoid creating dependent types in FloatOut
     13fdca3 Add a missing zonk in TcDerivInfer.simplifyDeriv
     82b77ec Do not quantify over deriving clauses
     15aefb4 Add missing T14325.stderr
     fb050a3 Do not bind coercion variables in SpecConstr rules
     3de788c Re-apply "Typeable: Allow App to match arrow types"
     2be55b8 Delete obsolete docs on GADT interacton with TypeApplications
     4a677f7 Remove section about ApplicativeDo & existentials (#13875)
     8adb84f Fix calculation in threadStackOverflow
     afac6b1 Fix typo
     6aa6a86 Fix typo
     add85cc Fix panic for `ByteArray#` arguments in CApiFFI foreign imports
     e3ba26f Implement new `compareByteArrays#` primop
     5984a69 Override default `clearBit` method impl for `Natural`
     843772b Enable testing 'Natural' type in TEST=arith011
     6cc232a Implement {set,clear,complement}BitBigNat primitives
     71a4235 configure: Fix CC version check on Apple compilers
     fd8b044 Levity polymorphic Backpack.
     5dab544 FreeBSD dtrace probe support
     7e790b3 rts: Label all threads created by the RTS
     8536b7f users-guide: Rework and finish debug flag documentation
     d7f4f41 users guide: Eliminate redundant :category: tags in debugging.rst
     c5da84d users-guide: Fix various warnings
     a69fa54 rts/posix: Ensure that memory commit succeeds
     d6c33da RtClosureInspect: Fix inspecting Char# on 64-bit big-endian
     366182a ghci: Include "Rts.h" before using TABLES_NEXT_TO_CODE
     9e3add9 Flags.hsc: Peek a CBool (Word8), not a Bool (Int32)
     aa98268 updateThunk: indirectee can be tagged
     21b7057 users-guide: Clarify -ddump-asm-regalloc-stages documentation
     6cb4642 Bump ghc-prim to 0.5.2.0 and update changelog
     ed48d13 Simplify, no functionality change
     2f43615 Fix grammaros in comments
     317aa96 Improve user’s guide around deriving
     74cd1be Don't deeply expand insolubles
     5a66d57 Better solving for representational equalities
     aba7786 Typofix in comment
     870020e whitespace only
     20ae22b Accept test output for #14350
     e023e78 Disable -XRebindableSyntax when running internal GHCi expressions
     101a8c7 Error when deriving instances in hs-boot files
     8846a7f Fix #14369 by making injectivity warnings finer-grained
     de8752e Export injectiveVarsOf{Binder,Type} from TyCoRep
     7ac22b7 User's guide: Fix the category of some flags
     3befc1a Bump arcanist-external-json-linter submodule
     1ba2851 Expose monotonic time from GHC.Event.Clock
     13758c6 Added a test for 'timeout' to be accurate.
     098dc97 Give a reference to Foreign.Concurrent.
     b6204f7 Untag the potential AP_STACK in stg_getApStackValzh
     2ca8cf6 Add Functor Bag instance
     afc04b2 Outputable: Add pprTraceException
     c1efc6e Comments and white space
     3acd616 Improve kick-out in the constraint solver
     e375bd3 Update record-wildcard docs
     99c61e2 Add stack traces on crashes on Windows
     bb537b2 nofib submodule: Fix a problem with fasta-c.c
     1e24a24 submodule nofib: Add digits-of-e1.faststdout
     052ec24 submodule nofib: Add digits-of-e2.faststdout
     b10a768 Comments only
     d1eaead Temporary fix to Trac #14380
     671b1ed User’s guide: Properly link to RTS flag -V
     8843a39 Include usg_file_hash in ghc --show-iface output
     3825b7e Remove the 'legroom' part of the timeout-accurate-pure test.
     b62097d Windows: Bump to GCC 7.2 for GHC 8.4
     e888a1f Revert "Windows: Bump to GCC 7.2 for GHC 8.4"
     561bdca Update Win32 version for GHC 8.4.
     f744261 ghc-cabal: Inline removed function from Cabal.
     2e16a57 Revert "ghc-cabal: Inline removed function ..."
     b1ad0bb Revert "Update Win32 version for GHC 8.4."
     61f1b46 Make language extensions their own category in the documentation
     bf83435 typecheck: Clarify errors mentioned in #14385
     bd53b48 Add info about Github pull requests.
     2a4c24e Make layLeft and reduceDoc stricter (#7258)
     980e127 Windows: Update the mirror script to generate hashes and use mirror fallback
     1c15d8e Fix space leak in BinIface.getSymbolTable
     df63668 Performance improvements linear regAlloc (#7258)
     f7f270e Implement `-Wpartial-fields` warning (#7169)
     821adee Fix a bug in 'alexInputPrevChar'
     2c23fff user-guide: Clarify default optimization flags
     4c06ccb base: Enable listToMaybe to fuse via foldr/build
     dbd81f7 Factor out readField (#14364)
     d91a6b6 Declare upstram repo location for hsc2hs
     160a491 users-guide: Disable index node generation
     9ae24bb configure: Add Alpine Linux to checkVendor
     a10c2e6 Don't use $SHELL in wrapper scripts
     355318c Add more pprTrace to SpecConstr (debug only)
     7d7d94f Fix an exponential-blowup case in SpecConstr
     41f9055 ApplicativeDo: handle BodyStmt (#12143)
     acd355a relnotes: Fix a few minor formatting issues
     faf60e8 Make tagForCon non-linear
     922db3d Manual: The -ddump-cmm-* flags had a wrong spelling in the manual
     97ca0d2 simplNonRecJoinPoint: Handle Shadowing correctly
     0e953da Implement a dedicated exitfication pass #14152
     3b784d4 base: Implement file locking in terms of POSIX locks
     cecd2f2 Add -falignment-sanitization flag
     7673561 Turn `compareByteArrays#` out-of-line primop into inline primop
     85aa1f4 Fix #14390 by making toIfaceTyCon aware of equality
     cca2d6b Allow packing constructor fields
     82bad1a A bit more tc-tracing
     1b115b1 Fix typo in accessor name
     ec356e8 Typofix in panic
     1569668 Typofixes in comments
     53700a9 minor wordsmithing
     201b5aa Catch a few more typos in comments
     609f284 Add Note [Setting the right in-scope set]
     af0aea9 core-spec: Add join points to formalism
     a95a849 Do not inline showWord
     32838c6 Mark `eqString` as `NOINLINE`
     8469ddd Implement loopification for local bindings (#14068)


More information about the ghc-commits mailing list