[commit: ghc] wip/orf-reboot's head updated: As if by magic, many AvailFields-related types disappear (9d13a83)

git at git.haskell.org git at git.haskell.org
Fri Jul 24 16:39:59 UTC 2015


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

Branch 'wip/orf-reboot' now includes:

     504c2ae Docs: `sortOn = sortBy (comparing f)` [skip ci]
     02897c5 Failing test case: idArity invariant check, #10181
     e29c2ac CoreUtils: Move seq* functions to CoreSeq
     ae0e340 CoreUtils: Move size utilities to CoreStats
     fa33f45 PprCore: Add size annotations for top-level bindings
     29f8225 CoreLint: Use size-annotated ppr variant
     82f1c78 Fix tests
     ae96c75 Implement -fprint-expanded-synonyms
     415351a Put Opt_Static into defaultFlags if not pc_DYNAMIC_BY_DEFAULT (#7478)
     2c5c297 DeriveFoldable for data types with existential constraints (#10447)
     2c9de9c Handle Char#, Addr# in TH quasiquoter (fixes #10620)
     a5e9da8 Fix off-by-one error in GHCi line reporting (Trac #10578)
     3448f98 Reduce non-determinism in ABI hashes with RULES and instance decls
     bc604bd Update assert to fix retc001 and retc002 (#9243)
     0d4b074 Travis: actually do debug builds
     ac0feec Testsuite: small test cleanups
     f607393 Testsuite: accept new stderr for T9497{a,b,c}-run (#10224)
     a0371c0 Build system: fail when encountering an unknown package tag
     dc6e556 Testsuite: mark T2497 expect_broken_for(#10657, ['optasm', 'optllvm'])
     dcaa486 Testsuite: mark T7919 expect_broken_for(#7919, ['optasm','dyn','optllvm'])
     11f8612 Testsuite: mark 3 tests expect_broken_for(#10181, ['optasm', 'optllvm'])
     16a8739 Testsuite: mark qq007 and qq008 expect_broken(#10181)
     cbb4d78 Testsuite: mark qq007 and qq008 expect_broken(#10047)
     43dafc9 Testsuite: mark gadt/termination expect_broken_for(#10658, ['optasm','optllvm'])
     34bb460 Testsuite: mark array001 and conc034 expect_broken_for(#10659, ['optasm',...])
     9834fea Add regression test for unused implicit parameter warning (#10632)
     4c96e7c Testsuite: add ImpredicativeTypes to T7861 (#7861)
     7f37274 Testsuite: add -XUndecidableInstances to T3500a
     029367e Testsuite: add regression test for missing class constraint
     82ffc80 LlvmCodeGen: add support for MO_U_Mul2 CallishMachOp
     49373ff Support wild cards in TH splices
     c526e09 primops: Add haddocks to BCO primops
     4cd008b Do not treat prim and javascript imports as C imports in TH and QQ
     96de809 Fix primops documentation syntax
     d71d9a9 Testsuite: fix concprog002 (AMP)
     2f18b197 Testsuite: mark concprog002 expect_broken_for(#10661, ['threaded2_hT'])
     d0cf8f1 Testsuite: simplify T8089 (#8089)
     b4ef8b8 Update submodule hpc with fix for #10529
     0c6c015 Revert "Revert "Change loadSrcInterface to return a list of ModIface""
     214596d Revert "Revert "Support for multiple signature files in scope.""
     9ade087 primops: Fix spelling mistake
     e0a3c44 Delete __GLASGOW_HASKELL__ ifdefs for stage0 < 7.8
     8f48fdc Use varToCoreExpr in mkWWcpr_help
     3fbf496 Comments only (superclasses and improvement)
     3509191 Refactor newSCWorkFromFlavoured
     7c0fff4 Improve strictness analysis for exceptions
     cd48797 Comments and white space only
     3c44a46 Refactor self-boot info
     efa7b3a Add NOINLINE for hs-boot functions
     aa78cd6 Documents -dsuppress-unfoldings
     0df2348 Comments and layout only
     a0e8bb7 Implement -dsuppress-unfoldings
     b5c1400 Comments and white space only
     f1d0480 Avoid out-of-scope top-level Ids
     7a6ed66 Comments only
     55754ea Fix test T2497 to avoid infinite loop in RULES
     feaa095 Do occurrence analysis on result of BuiltInRule
     00f3187 Make seq-of-cast rule generate a case
     35eb736 T4945 is working again
     f519cb5 testsuite: Show killed command line on timeout
     97a50d5 configure: Bump minimum bootstrap GHC version to 7.8
     dbe6dac When iconv is unavailable, use an ASCII encoding to encode ASCII
     18c6ee2 Travis: use ghc-7.8.4 as stage0 to fix the build
     d941a89 Validate: by default do show commands
     a7e0326 Validate: document --quiet [skip ci]
     1224bb5 Add utility function isHoleName.
     50b9a7a Revert "Trac #4945 is working again"
     1b76997 Testsuite: recenter haddock.base allocation numbers
     b949c96 Eliminate zero_static_objects_list()
     0d1a8d0 Two step allocator for 64-bit systems
     e3df1b1 Validate: explain THREADS instead of CPUS in --help
     cf57f8f Travis: do pass `--quiet` to validate
     0b12aca Switch from recording IsBootInterface to recording full HscSource.
     adea827 Add ExceptionMonad instance for IOEnv.
     144096e Give more informative panic for checkFamInstConsistency.
     4a9b40d Export alwaysQualifyPackages and neverQualifyPackages.
     939f1b2 Some utility functions for testing IfaceType equality.
     dd365b1 Use lookupIfaceTop for loading IfaceDecls.
     5c3fc92 Fix Trac #10670
     9851275 Comments only
     d784bde Lexer: support consecutive references to Haddock chunks (#10398)
     d2b4df1 Generate .dyn_o files for .hsig files with -dynamic-too
     76e2341 Accept next-docstrings on GADT constructors.
     e78841b Update encoding001 to test the full range of non-surrogate code points
     b5c9426 Parenthesise TypeOperator in import hints
     1852c3d DataCon: Fix redundant import
     4c8e69e rts/sm: Add missing argument names in function definitions
     7ec07e4 Slight refactoring to the fix for #4012
     608e76c Document type functions in the Paterson conditions
     e809ef5 ghci: fixity declarations for infix data constructors (#10018)
     5ff4dad Add a few comments from SPJ on fixity declarations
     f9687ca Library names, with Cabal submodule update
     45c319f Fix line number in T10018 testcase
     30d8349 Comments only
     e161634 Comments about stricteness of catch#
     d53d808 Refactoring around FunDeps
     6e618d7 Improve instanceCantMatch
     6ebd548 Merge remote-tracking branch 'origin/master' into wip/orf-reboot
     aaa16ed Get rid of redundant getDFunHsTypeKey
     deaf8f1 Comments only
     9d13a83 As if by magic, many AvailFields-related types disappear


More information about the ghc-commits mailing list