[commit: ghc] wip/rae's head updated: Fix egregious duplication of vars in RnTypes (7069a5d)

git at git.haskell.org git at git.haskell.org
Wed Aug 16 19:19:14 UTC 2017


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

Branch 'wip/rae' now includes:

     362339d Fix note references and some typos
     d774b4e Fix #13968 by consulting isBuiltInOcc_maybe
     4a26415 Remove unneeded import
     8e15e3d Improve error messages around kind mismatches.
     c9667d3 Fix #11400, #11560 by documenting an infelicity.
     9a54975 Test #11672 in typecheck/should_fail/T11672.
     ef39af7 Don't tidy vars when dumping a type
     bb2a446 Preserve CoVar uniques during pretty printing
     79cfb19 Remove old coercion pretty-printer
     c2417b8 Fix #13819 by refactoring TypeEqOrigin.uo_thing
     fb75213 Track visibility in TypeEqOrigin
     10d13b6 Fix #11963 by checking for more mixed type/kinds
     ca47186 Document that type holes kill polymorphic recursion
     1696dbf Fix #12176 by being a bit more careful instantiating.
     4239238 Fix #12369 by being more flexible with data insts
     791947d Refactor tcInferApps.
     7af0b90 Initialize hs_init with UTF8 encoded arguments on Windows.
     6b77914 Fix instantiation of pattern synonyms
     af6d225 Remove redundant constraint in context
     b1317a3 Fix ASSERT failure in tc269
     452755d Do not discard insolubles in implications
     ad0037e Add DebugCallStack to piResultTy
     d618649 Error eagerly after renaming failures in reifyInstances
     b3b564f Merge types and kinds in DsMeta
     424ecad Add regression tests for #13601, #13780, #13877
     5e940bd Switched out optparse for argparse in runtests.py
     54d3a1f testsuite: Produce JUnit output
     262bb95 testsuite: Add test for #14028
     274e9b2 Add “BINARY_DIST_DIR” to Makefile
     dac4b9d ByteCodeGen: use byte indexing for BCenv
     2974f81 Fix lld detection if both gold and lld are found
     f134bfb gitmodules: Delete entry for dead hoopl submodule
     d08b9cc configure: Ensure that user's LD setting is respected
     0e3c101 Ensure that we always link against libm
     0e3eacc testsuite: Don't pass allow_abbrev
     121fee9 Remove unnecessary GHC option from SrcLoc
     9e9fb57 Fix hs-boot knot-tying with record wild cards.
     d75bba8 Add rtsopts ignore and ignoreAll.
     84f8e86 Ensure that GHC.Stack.callStack doesn't fail
     9cfabbb Add '<&>' operator to Data.Functor. '<&>' calls '<$>' with flipped arguments.
     d1ef223 Fix #14045 by omitting an unnecessary check
     f839b9d Add regression test for #14055
     7089dc2 Follow-up to #13887, for promoted infix constructors
     9699286 Typofixes [ci skip]
     f2c12c3 Add haddock markup
     49e334c Allow Windows to set blank environment variables
     c6d4219 Clarify comment about data family arities
     2535a67 Refactoring around FunRhs
     4636886 Improve the desugaring of -XStrict
     3ab342e Do a bit more CSE
     af89d68 Reject top-level banged bindings
     7f2dee8 Remove redundant goop
     4fdc523 Use field names for all uses of datacon Match
     2ef973e A bunch of typofixes
     7a74f50 Typofixes [ci skip]
     5a7af95 KnownUniques: Handle DataCon wrapper names
     29f07b1 Allow bundling pattern synonyms with exported data families
     74c7016 rts: Fix "variable set but not used" warning
     b311096 Simplify OccurAnal.tagRecBinders
     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)
     a0c6a10 Test #14038 in dependent/should_compile/T14038
     ac03a73 Regression test for #12742
     763d153 Test #12938 in indexed-types/should_compile/T12938
     75fedb8 Fix #13391 by checking for kind-GADTs
     3062e95 Fix #13399 by documenting higher-rank kinds.
     c93e798 Fix #13407 by suppressing invisibles better.
     f5e7cf0 Fix #13909 by tweaking an error message.
     1617cab Make rejigConRes do kind substitutions
     483bb2b Fix #13929 by adding another levity polymorphism check
     59e7fa5 Test #13938, with expect_broken
     68c1186 Fix #13963.
     7069a5d Fix egregious duplication of vars in RnTypes


More information about the ghc-commits mailing list