[commit: ghc] wip/GenericsMetaData2's head updated: Use TypeLits in the meta-data encoding of GHC.Generics (950b5f9)

git at git.haskell.org git at git.haskell.org
Sun Nov 23 17:51:17 UTC 2014


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

Branch 'wip/GenericsMetaData2' now includes:

     9a20379 Fix ffi023
     20226c2 Whitespace only
     ac1281f Outputable instance for IfaceVectInfo
     535644f Add missing semicolon in Schedule.c
     1f6b1ab base: Fix (**) instance for Data.Complex (#8539)
     ddb484c Update comment about C helper for foreign exports (#9713)
     87cd37b Fix usage of `find -perm` in aclocal.m4 (#9697)
     21f9bc4 mapMaybe: Typo in the comment (#9644)
     c557f99 Disable AVX for LLVM 3.2 by default (#9391)
     e7b414a Fix detection of GNU gold linker if invoked via gcc with parameters
     a736b51 Revert "base: Fix (**) instance for Data.Complex (#8539)"
     483eeba Comments only
     1019e3c When outputting list of available instances, sort it.
     7c748d9 Support for "with" renaming syntax, and output a feature flag.
     4224466 Reimplement im/export primitives for integer-gmp2
     e2af452 Restore exact old semantics of `decodeFloat`
     4ba884b Optimise `Identity` instances with `coerce`
     8e0a480 rts: remove old-style field designator extension (#9396)
     101c62e The test runner now also works under the msys-native Python.
     6fc78fd Refactor: use System.FilePath.splitSearchPath
     66c0513 Update documentation for "Batch compiler mode"
     00c1a30 Implement new Foldable methods for HsPatSynDetails
     5db61ea Turn CoreWriter into a newtype; fix comment
     5c09893 Add remaining <unknown>s and comments to .mailmap
     7ef0971 Filter input to abiHash early
     b3df5f6 template-haskell: Missing instances for Rational and ().
     b047733 add missing instances for Loc and a few missing Eq instances
     146dd13 Only test for bug #9439 when llvm is installed
     53a4742 Allow -dead_strip linking on platforms with .subsections_via_symbols
     33c029f make TcRnMonad.lhs respect -ddump-to-file
     4dd87c5 use correct word size for shiftRightLogical and removeOp32
     80f6fc1 compiler/main: fixes #9776
     d87fa34 arm64: 64bit iOS and SMP support (#7942)
     bc2289e ghc generates more user-friendly error messages
     c6e12e6 Make calling conventions in template haskell Syntax.hs consistent with those in ghc ForeignCall.hs this impliments #9703 from ghc trac
     8cbd25a Make Data.Functor.Identity trustworthy again
     3b81309 Update shift/reduce conflict number in parser
     cce6318 Add support for pattern synonym type signatures. Syntax is of the form
     64cb496 Implement typechecker plugins
     696fc4b Split SynTyCon to SynonymTyCon and FamilyTyCon
     e2f7803 Kill trailing whitespace
     6db0f6f Test #9209 in th/T9209
     5a8ae60 Fix #9209, by reporting an error instead of panicking on bad splices.
     e394e74 Fix #9220 by adding role annotations.
     67abfda Test #9151 in typecheck/should_compile/T9151.
     786b62a Add release notes for #8100, #9527, and #9064.
     5eebd99 Test #9318 in typecheck/should_fail/T9318
     8fea2ac Test #9201 in typecheck/should_fail/T9201
     113a37b Update manual to get rid of bogus `coerce` example (#9788)
     cb41e08 Test #9109 in typecheck/should_fail/T9109
     6efe572 Don't build old-{time,locale} and haskell{98,2010}
     86dda8f Delete old-{time,locale} and haskell{98,2010}
     e888b94 Hide `Data.OldList` module
     f60eeb4 Export scanl' from Data.OldList and Data.List
     067f1e4 Add flag `-fwarn-missing-exported-sigs`
     7ed482d Implement #5462 (deriving clause for arbitrary classes)
     27f9c74 Unbreak build (fallout from 067f1e4f20e)
     fec1c30 Revert change to alias handling in ppLlvmGlobal introduced in d87fa34, which requires LLVM 3.6.
     b0dd347 Rewrite Note [Deriving any class]
     eac9bbe Comments only
     e876208 Rejig builders for pattern synonyms, especially unlifted ones
     76f5f11 Move all the zonk/tidy stuff together into TcMType (refactoring only)
     b685542 Implement full co/contra-variant subsumption checking (fixes Trac #9569)
     073119e Put the decision of when a unification variable can unify with a polytype
     0f5c163 Make the on-the-fly unifier defer forall/forall unification
     16d10ae Fix a latent promotion bug in TcSimplify.simplifyInfer
     5f39c4d Remove TcMType from compiler_stage2_dll0_MODULES
     5760eb5 Test Trac #9318
     b82410a Trac #9222 is actually an ambiguous type, now detected
     e639120 Delete duplicated tests
     230b013 Test Trac #9569
     7b1a856 Fix up tests for Trac #7220; the old test really was ambiguous
     1b6988e Test T2239 actually succeeds without impredicativity, because of the new co/contra subsumption check
     eaccc72 Wibbles (usually improvements) to error messages
     4ba4cc7 Fix Trac #9815
     c5a3938 Test Trac #8149
     6d40470 Comments only
     dbf360a Test #7484 in th/T7484
     da2fca9 Fix #7484, checking for good binder names in Convert.
     adb20a0 Test #1476 in th/T1476
     d627c5c Test that nested pattern splices don't scope (#1476).
     2346de4 Fix #1476 by making splice patterns work.
     1b22d9f Release notes for #1476, #7484.
     3b3944f Test #9824 in th/T9824
     bc05354 Fix #9824 by not warning about unused matches in pattern quotes.
     cfa574c Update manual for pattern splices (#1476)
     7927658 AST changes to prepare for API annotations, for #9628
     803fc5d Add API Annotations
     3e4f49b Fixes ghci :unset -X<ext> so that it doesn't fail to reverse option. (fixes trac #9293)
     3793d3b Export more Packages functions
     a97f90c Add Data.Void to base (re #9814)
     c0ad5bc Capture original source for literals
     3583312 Add 'fillBytes' to Foreign.Marshal.Utils.
     6265f1c Add T7220a.stderr
     065d433 Update Control.Monad.ST.* for Safe Haskell as now they're safe by default
     453ce62 Update Foreign.* for Safe Haskell now that they're safe by default
     5f84bd1 Improve Safe Haskell bounds for changes to base over time
     2a523eb Be consistent with placement of Safe Haskell mode at top of file
     e16a342 llvmGen: Compatibility with LLVM 3.5 (re #9142)
     3222b7a Add displayException method to Exception (#9822)
     02f8f6a Add function for size-checked conversion of Integral types
     624a7c5 ghc: allow --show-options and --interactive together
     2cc854b Add -fdefer-typed-holes flag which defers hole errors to runtime.
     137b331 Deprecate Data.Version.versionTags (#2496)
     8a8cdbb Implement `Natural` number type (re #9818)
     ef5bcc1 Re-center bytes-allocated for `haddock.compiler`
     888d75c Revert "Test Trac #9318"
     be7fb7e integer-gmp2: export `Word`-counterpart of gcdInt
     2b71b35 Remove reference to `MIN_VERSION_integer_gmp2`
     5ea3ee0 Add gcd/Word RULE-based optimisation
     4b65376 Add `isValidNatural` predicate (#9818)
     b836139 Fix `fromInteger` constructing invalid `Natural`
     41300b7 Implement {gcd,lcm}/Natural optimisation (#9818)
     96d29b5 Call `popCountBigNat` directly (#9818)
     950b5f9 Use TypeLits in the meta-data encoding of GHC.Generics


More information about the ghc-commits mailing list