[commit: ghc] wip/ttypeable's head updated: Fix submodules (594e948)

git at git.haskell.org git at git.haskell.org
Sat Oct 1 21:36:12 UTC 2016


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

Branch 'wip/ttypeable' now includes:

     9031382 MkCore: Fix some note names
     a6819a0 base: Add release date to changelog
     bf7cbe7 users-guide: Note multiple pattern signature change in relnotes
     afec447 testsuite: Add testcase for #12355
     2a3af15 Treat duplicate pattern synonym signatures as an error
     3b2deca users-guide: Remove static field type from rts-flag
     331febf CallArity: Use not . null instead of length > 0
     0bd7c4b Enum: Ensure that operations on Word fuse
     18e71e4 Revert "Fix 32-bit build failures"
     890ec98 Revert "Linker: some extra debugging / logging"
     e10497b Kill some varEnvElts
     85aa6ef Check generic-default method for ambiguity
     1267048 Extra ASSERTs for nameModule
     55e43a6 Use DVarEnv for vectInfoVar
     5f79394 Delete out-of-date comment
     895eefa Make unique auxiliary function names in deriving
     cbe30fd Tidy up tidying
     f2d36ea White space only
     6cedef0 Test Trac #12133
     27fc75b Document codegen nondeterminism
     18b782e Kill varEnvElts in zonkEnvIds
     1b058d4 Remove varEnvElts
     b7b130c Fix GetTime.c on Darwin with clock_gettime
     f560a03 Adds x86_64-apple-darwin14 target.
     567dbd9 Have addModFinalizer expose the local type environment.
     56f47d4 Mention addModFinalizer changes in release notes.
     672314c Switch to LLVM version 3.8
     b9cea81 Show testcase where demand analysis abortion code fails
     979baec --without-libcharset disables the use of libcharset
     bedd620 Style changes for UniqFM
     6ed7c47 Document some codegen nondeterminism
     9858552 Use deterministic maps for FamInstEnv
     34085b5 Correct the message displayed for syntax error (#12146)
     64bce8c Add Note [FamInstEnv determinism]
     6e280c2 Utils: Fix `lengthIs` and `lengthExceeds` for negative args
     0481324 Use UniqDFM for InstEnv
     b8cd94d GHC.Stack.CCS: Fix typo in Haddocks
     91fd87e FastString: Reduce allocations of concatFS
     15751f2 FastString: Add IsString instance
     c4a9dca FastString: Supply mconcat implementation
     fc53d36 OccName: Implement startsWithUnderscore in terms of headFS
     eb3d659 OccName: Avoid re-encoding derived OccNames
     4f21a51 Kill eltsUFM in classifyTyCons
     6c7c193 DsExpr: Remove usage of concatFS in fingerprintName
     0177c85 Testsuite: expose TEST_CC (path to gcc)
     f53d761 TysWiredIn: Use UniqFM lookup for built-in OccNames
     9a3df1f check-api-annotations utility loads by filename
     17d0b84 Add -package-env to the flags reference
     372dbc4 Pretty: delete really old changelog
     45d8f4e Demand analyser: Implement LetUp rule (#12370)
     18ac80f tidyType: Rename variables of nested forall at once
     cd0750e tidyOccNames: Rename variables fairly
     37aeff6 Added type family dependency to Data.Type.Bool.Not
     b35e01c Bring comments in TcGenGenerics up to date
     a9bc547 Log heap profiler samples to event log
     ffe4660 IfaceEnv: Only check for built-in OccNames if mod is GHC.Types
     24f5f36 Binary: Use ByteString's copy in getBS
     0f0cdb6 Bugfix for bug 11632: `readLitChar` should consume null characters
     1ba79fa CodeGen: Way to dump cmm only once (#11717)
     89a8be7 Pretty: remove a harmful $! (#12227)
     5df92f6 hp2ps: fix invalid PostScript for names with parentheses
     d213ab3 Fix misspellings of the word "instance" in comments
     3fa3fe8 Make DeriveFunctor work with unboxed tuples
     514c4a4 Fix Template Haskell reification of unboxed tuple types
     1fc41d3 Make okConIdOcc recognize unboxed tuples
     0df3f4c Fix PDF build for the User's Guide.
     98b2c50 Support SCC pragmas in declaration context
     e46b768 Make Data.{Bifoldable,Bitraversable} -XSafe
     908f8e2 TcInteract: Add braces to matchClassInst trace output
     8de6e13 Fix bytecode generator panic
     cac3fb0 Cleanup PosixSource.h
     a0f83a6 Data.Either: Add fromLeft and fromRight (#12402)
     627c767 Update docs for partial type signatures (#12365)
     ed48098 InstEnv: Ensure that instance visibility check is lazy
     9513fe6 Clean up interaction between name cache and built-in syntax
     a4f2b76 testsuite: Add regression test for #12381
     93acc02 Add another testcase for #12082
     cf989ff Compact Regions
     83e4f49 Revert "Clean up interaction between name cache and built-in syntax"
     714bebf Implement unboxed sum primitive type
     a09c0e3 Comments only
     9c54185 Comments + tiny refactor of isNullarySrcDataCon
     8d4760f Comments re ApThunks + small refactor in mkRhsClosure
     6a4dc89 Bump Haddock submodule
     8265c78 Fix and document Unique generation for sum TyCon and DataCons
     e710f8f Correct a few mistyped words in prose/comments
     bbf36f8 More typos in comments
     fb34b27 Revert "Cleanup PosixSource.h"
     86b1522 Unboxed sums: More unit tests
     bfef2eb StgCmmBind: Some minor simplifications
     c4f3d91 Add deepseq dependency and a few NFData instances
     648fd73 Squash space leaks in the result of byteCodeGen
     7f0f1d7 -fprof-auto-top
     1fe5c89 UNPACK the size field of SizedSeq
     d068220 Fix the non-Linux build
     4036c1f Testsuite: fix T10482a
     1967d74 Some typos in comments
     a9251c6 MonadUtils: Typos in comments
     1783011 Fix productivity calculation (#12424)
     9d62f0d Accept better stats for T9675
     8f63ba3 Compute boot-defined TyCon names from ModIface.
     b0a5144 Add mblocks_allocated to GC stats API
     e98edbd Move stat_startGCSync
     d3feb16 Make Unique a newtype
     c06e3f4 Add atomic operations to package.conf.in
     89ae1e8 Relevant Bindings no longer reports shadowed bindings (fixes #12176)
     750553a Use MO_Cmpxchg in Primops.cmm instead of ccall cas(..)
     2078909 Typo in comment
     36565a9 ForeignCall.hs: Remove DrIFT directives
     55f5aed Track the lengths of the thread queues
     988ad8b Fix to thread migration
     d1fe08e Only trace cap/capset events if we're tracing anything else
     4dcbbd1 Remove the DEBUG_<blah> variables, use RtsFlags directly
     9df9490 StgSyn: Remove unused StgLiveVars types
     2f79e79 Add comment about lexing of INLINE and INLINABLE pragma
     0c37aef Update old comment InlinePragma
     b1e6415 More comments about InlinePragmas
     7a06b22 Typo in comment [skip ci]
     7a8ef01 Remove `setUnfoldingInfoLazily`
     a13fda7 Clarify comment on makeCorePair
     d85b26d CmmLive: Remove some redundant exports
     8ecac25 CmmLayoutStack: Minor simplification
     fc66415 Replace an unsafeCoerce with coerce
     db5a226 Fix omission in haddock instance head
     1101045 Trim all spaces after 'version:'
     fe4008f Remove identity update of field componentsConfigs
     f09d654 check that the number of parallel build is greater than 0
     e3e2e49 codeGen: Remove binutils<2.17 hack, fixes T11758
     ca7e1ad Expanded abbreviations in Haddock documentation
     ce13a9a Fix an assertion that could randomly fail
     89fa4e9 Another try to get thread migration right
     8fe1672 Bump `hoopl` submodule, mostly cosmetics
     253fc38 Temporarily mark T1969 perf test as broken (#12437)
     7354f93 StgCmm: Remove unused Bool field of Return sequel
     02614fd Replace some `length . filter` with `count`
     9aa5d87 Util.count: Implement as a left-fold instead of a right-fold
     affcec7 rts/Printer.h: fix constness of argument declaration
     03af399 AsmCodeGen: Give linear-scan and coloring reg. allocators different cc names
     3bfe6a5 RegAlloc: Remove duplicate seqList (use seqList from Util)
     bd51064 RegAlloc: Use IntSet/IntMaps instead of generic Set/Maps
     7a2e933 Use Data.Functor.Const to implement Data.Data internals
     6fe2355 configure.ac: Remove checks for bug 9439
     773e3aa T1969: Enable it again but bump the max residency temporarily
     4d9c22d Fix typo in Data.Bitraversable Haddocks
     fe19be2 Cabal submodule update.
     dd23a4c Actually update haddock.Cabal stats.
     e79bb2c Fix a bug in unboxed sum layout generation
     9684dbb Remove StgRubbishArg and CmmArg
     ac0e112 Improve missing-sig warning
     bd0c310 Fix GHCi perf-llvm build on x86_64
     37a7bcb Update `nofib` submodule to newest commit
     7ad3b49 Misspellings in comments [skip ci]
     18f0687 Fix configure detection.
     ffd4029 fix compilation failure on OpenBSD with system supplied GNU C 4.2.1
     fc1432a Update hoopl submodule (extra .gitignore entry)
     3551e62 refactor test for __builtin_unreachable into Rts.h macro RTS_UNREACHABLE
     da99a7f Darwin: Detect broken NM program at configure time
     f9a11a2 When in sanity mode, un-zero malloc'd memory; fix uninitialized memory bugs.
     d331ace Minor typofix.
     b222ef7 Typofix in System.Environment docs.
     34da8e5 Typo in comment
     efc0372 Not-in-scope variables are always errors
     f352e5c Keep the bindings local during defaultCallStacks
     58e7316 Refactor nestImplicTcS
     d610274 Revert "T1969: Enable it again but bump the max residency temporarily"
     113d50b Add gcoerceWith to Data.Type.Coercion
     b2c5e4c Revert "codeGen: Remove binutils<2.17 hack, fixes T11758"
     896d216 Annotate initIfaceCheck with usage information.
     e907e1f Axe initIfaceTc, tie the knot through HPT (or if_rec_types).
     704913c Support for noinline magic function.
     1f1bd92 Introduce BootUnfolding, set when unfolding is absent due to hs-boot file.
     5a8fa2e When a value Id comes from hi-boot, insert noinline. Fixes #10083.
     8fd1848 Retypecheck both before and after finishing hs-boot loops in --make.
     e528061 We also need to retypecheck before when we do parallel make.
     0d3bf62 Fix #12472 by looking for noinline/lazy inside oversaturated applications.
     f9aa996 pass -z wxneeded or -Wl,-zwxneeded for linking on OpenBSD
     fb0d87f Splice singleton unboxed tuples correctly with Template Haskell
     1f75440 Extra comments, as per SPJ in #12035.
     acdbd16 Move #12403, #12513 users guide notes to 8.2.1 release notes
     89facad Add T12520 as a test
     1766bb3 RtClosureInspect: Fix off-by-one error in cvReconstructType
     613d745 Template Haskell support for unboxed sums
     7a86f58 Comments only: Refer to actually existing Notes
     8d92b88 DmdAnal: Add a final, safe iteration
     d6fd2e3 DmdAnal: Testcase about splitFVs and dmdFix abortion
     ec7fcfd Degrade "case scrutinee not known to diverge for sure" Lint error to warning
     faaf313 WwLib: Add strictness signature to "let x = absentError …"
     1083f45 Fix doc build inconsistency
     ae66f35 Allow typed holes to be levity-polymorphic
     a60ea70 Move import to avoid warning
     0050aff Fix scoping of type variables in instances
     ca8c0e2 Typofix in docs.
     983f660 Template Haskell support for TypeApplications
     822af41 Fix broken Haddock comment
     f4384ef Remove unused DerivInst constructor for DerivStuff
     21c2ebf Missing stderr for T12531.
     9d17560 GhcMake: limit Capability count to CPU count in parallel mode
     a5d26f2 rts: enable parallel GC scan of large (32M+) allocation area
     044e81b OccName: Remove unused DrIFT directive
     ff1931e TcGenDeriv: Typofix
     d168c41 Fix and complete runghc documentation
     6781f37 Clarify pkg selection when multiple versions are available
     83b326c Fix binary-trees regression from unnecessary floating in CorePrep.
     a25bf26 Tag pointers in interpreted constructors
     ef784c5 Fix handling of package-db entries in .ghc.environment files, etc.
     2ee1db6 Fixes #12504: Double-escape paths used to build call to hsc_line
     28b71c5 users_guide: More capabilities than processors considered harmful
     0e74925 GHC: Expose installSignalHandlers, withCleanupSession
     3005fa5 iserv: Show usage message on argument parse failure
     d790cb9 Bump the default allocation area size to 1MB
     d40d6df StgCmmPrim: Add missing MO_WriteBarrier
     d1f2239 Clarify scope of `getQ`/`putQ` state.
     22259c1 testsuite: Failing testcase for #12091
     2d22026 ErrUtils: Expose accessors of ErrDoc and ErrMsg
     a07a3ff A failing testcase for T12485
     9306db0 TysWiredIn: Use dataConWorkerUnique instead of incrUnique
     9cfef16 Add Read1/Read2 methods defined in terms of ReadPrec
     1ad770f Add -flocal-ghci-history flag (#9089).
     010b07a PPC NCG: Implement minimal stack frame header.
     ca6d0eb testsuite: Update bytes allocated of parsing001
     75321ff Add -fdefer-out-of-scope-variables flag (#12170).
     e9b0bf4 Remove redundant-constraints from -Wall (#10635)
     043604c RnExpr: Fix ApplicativeDo desugaring with RebindableSyntax
     dad6a88 LoadIFace: Show known names on inconsistent interface file
     3fb8f48 Revert "testsuite: Update bytes allocated of parsing001"
     a69371c users_guide: Document removal of -Wredundant-constraints from -Wall
     ad1e072 users_guide: Move addModFinalizer mention to 8.0.2 release notes
     1f5d4a3 users_guide: Move -fdefer-out-of-scope-variables note to 8.0.2 relnotes
     da920f6 users_guide: Move initGhcMonad note to 8.0.2 relnotes
     a48de37 restore -fmax-worker-args handling (Trac #11565)
     1e39c29 Kill vestiages of DEFAULT_TMPDIR
     8d35e18 Fix startsVarSym and refactor operator predicates (fixes #4239)
     b946cf3 Revert "Fix startsVarSym and refactor operator predicates (fixes #4239)"
     f233f00 Fix startsVarSym and refactor operator predicates (fixes #4239)
     e5ecb20 Added support for deprecated POSIX functions on Windows.
     0cc3931 configure.ac: fix --host= handling
     818760d Fix #10923 by fingerprinting optimization level.
     36bba47 Typos in notes
     33d3527 Protect StablPtr dereference with the StaticPtr table lock.
     133a5cc ghc-cabal: accept EXTRA_HC_OPTS make variable
     f93c363 extend '-fmax-worker-args' limit to specialiser (Trac #11565)
     ac2ded3 Typo in comment
     57aa6bb Fix comment about result
     f8b139f test #12567: add new testcase with expected plugin behaviour
     1805754 accept current (problematic) output
     cdbb9da cleanup: drop 11 years old performance hack
     71dd6e4 Don't ignore addTopDecls in module finalizers.
     6ea6242 Turn divInt# and modInt# into bitwise operations when possible
     8d00175 Less scary arity mismatch error message when deriving
     4ff4929 Make generated Ord instances smaller (per #10858).
     34010db Derive the Generic instance in perf/compiler/T5642
     05b497e distrib: Fix libdw bindist check
     a7a960e Make the test for #11108 less fragile
     dcc4904 Add failing testcase for #12433
     feaa31f Remove references to -XRelaxedPolyRec
     5eab6a0 Document meaning of order of --package-db flags, fixes #12485.
     a8238a4 Update unix submodule to latest HEAD.
     65d9597 Add hook for creating ghci external interpreter
     1b5f920 Make start address of `osReserveHeapMemory` tunable via command line -xb
     7b4bb40 Remove -flocal-ghci-history from default flags
     710f21c Add platform warning to Foreign.C.Types
     158288b Generalise type of mkMatchGroup to unify with mkMatchGroupName
     04184a2 Remove uses of mkMatchGroupName
     7b7ea8f Fix derived Ix instances for one-constructor GADTs
     0e7ccf6 Fix TH ppr output for list comprehensions with only one Stmt
     454033b Add hs_try_putmvar()
     03541cb Be less picky about reporing inaccessible code
     21d0bfe Remove unused exports
     35086d4 users_guide: Fix Docbook remnant
     b451fef users_guide: #8761 is now fixed
     c6ac1e5 users_guide: TH now partially supports typed holes
     6555c6b rts: Disable -hb with multiple capabilities
     5eeabe2 Test wibbles for commit 03541cba
     ec3edd5 Testsuite wibbles, to the same files
     505a518 Comments and white space only
     8074e03 Comments and white space only
     876b00b Comments and white space
     86836a2 Fix codegen bug in PIC version of genSwitch (#12433)
     9123845 tryGrabCapability should be using TRY_ACQUIRE_LOCK
     626db8f Unify CallStack handling in ghc
     a001299 Comments only
     a72d798 Comments in TH.Syntax (Trac #12596)
     97b47d2 Add test case for #7611
     ea310f9 Remove directories from include paths
     14c2e8e Codegen for case: Remove redundant void id checks
     6886bba Bump Haddock submodule to fix rendering of class methods
     8bd3d41 Fix failing test T12504
     9cbcdb4 shutdownHaskellAndExit: just do a normal hs_exit() (#5402)
     74c4ca0 Expose hs_exit_(rtsFalse) as hs_exit_nowait()
     3a17916 Improved documentation for Foreign.Concurrent (#12547)
     9766b0c Fix #12442.
     122da81 HACK: CoreLint: Kill unsaturated unlifted types check
     08c0a50 TcSMonad: Introduce tcLookupId
     f11a313 CoreLint: Improve debug output
     6bf102c Start implementing library side of TTypeable
     4579316 Fix rebase
     724c585 Add quick compatibility note
     ded63e2 Fix warnings
     2f2e044 Various fixes
     cd17075 Fix serialization
     be801fc Implement Data.Typeable.funResultTy
     1c0a5fd Binary: More explicit pattern matching
     41612a8 More serialization
     709b923 Message: Import Data.Typeable.TypeRep
     85a7fe6 TcInteract: Unused parameter
     c02f748 Fix a few TTypeRep references
     0d28ee9 Fix recursive fingerprints
     8a893ff Finally serialization is both general and correct
     bab42dd Break recursive loop in serialization
     c06f90d Kill todo
     4f02585 Fix up representation pretty-printer
     01820df Another recursive serialization case
     9818753 TcTypeable: Don't generate bindings for special primitive tycons
     59ea724 Move special tycons
     55e057e Internal things
     da824f2 Fix primitive types
     8ff0010 Fix pretty-printer
     7661ba2 Kill debugShow
     1b7d4be Inline space
     054318e Accept easy test output
     bf7f460 Add mkFunTy
     94572f7 More test fixes
     5f7f46f Fix T8132
     2b229e8 Render TYPE 'PtrRepLifted as *
     84d6743 Internal: Rename type variable
     980221b Implement withTypeable
     75646c4 Bump base to 4.10.0
     6573b08 Fix withTypeable
     ae53687 Bump base
     0d27bb9 testsuite: Bump base version
     1b2f6a3 Rework Show
     ed2e97e Testsuite updates
     051c277 Clarify serialization errors
     7f5e6f2 Kill redundant comment
     ac91bb2 Note need for mkTrApp
     30301c6 Make TRApp bidirectional
     a05f387 Add TRArrow pattern synonym
     317be40 Fix up type printer
     b05e83c submodule changes
     38bf32d TcInteract: Fix something
     16cdaa1 Fix showTypeable
     6dcb726 Fix serialization
     082104d Clarify comments
     6fad3f8 Binary: Simple serialization test works
     c1a6541 Give unboxed tuples type representations
     45f2605 testsuite/TypeRep: Add test for #12409
     3b67166 testsuite: Add test of Typeable Binary instances
     8fd5510 TcTypeable: Clarify comment
     4ff0352 Update submodules
     083e183 Temporarily override submodule upstream repo paths
     ae3464e Add a TestEquality TypeRep instance
     05c1608 Debug
     594e948 Fix submodules


More information about the ghc-commits mailing list