[commit: ghc] wip/t-12758_circleci_push_perf_notes's head updated: - (bb48dcd)

git at git.haskell.org git at git.haskell.org
Tue Oct 23 11:13:10 UTC 2018


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

Branch 'wip/t-12758_circleci_push_perf_notes' now includes:

     db6f1d9 Turn infinite loop into a panic
     8c7f90a Fix a typo in TcValidity.checkFamInstRhs
     2a54209 Comments only
     4293a80 Accommodate API change in transSuperClasses
     8d72f87 TcSimplify: Condense MASSERT2() usage onto a single line
     edb4714 docs: Add changelog and release notes entry for traceBinaryEvent#
     14d8838 Update unicode tables to v. 12 of the standard
     184a569 Clean up TcHsSyn.zonkEnv
     1cca442 Comments only
     4b79329 Add comments about pretty-printing via IfaceSyn
     ff29fc8 Better error reporting for inaccessible code
     c523525 ghc, ghc-pkg: use getExecutablePath on Windows when base >= 4.11.0
     5e6cf2a Fix #15550 by quoting RULE names during TH conversion
     7a3cda5 Fix #15502 by not casting to Int during TH conversion
     744b034 Take strict fields into account in coverage checking
     6e765ae Don't reify redundant class method tyvars/contexts
     2d953a6 Fix #10859 by using foldr1 while deriving Eq instances
     b1f5d2f Bump nofib submodule
     154d4e2 Remove dph, vector, primitive and random from .gitmodules
     2cf98e2 rts: Handle SMALL_MUT_ARR_PTRS in retainer profilter
     c18b525 Remove dead code for commandline parsing
     c46a5f2 Fix #15572 by checking for promoted names in ConT
     34b8e61 Fix typo in 8.6.1 notes
     102284e Rename kind vars in left-to-right order in bindHsQTyVars
     36c1431 Fixed typo in exponent example
     65eec9c Fix a constant folding rule
     f48e276 Finish stable split
     97826e3 Fix the __GLASGOW_HASKELL__ comparison
     12e6e19 A few typos [ci skip]
     140563f fix -ddump-asm description
     5d3eb64 Minor improvements to comments [skip ci]
     5851885 Comments only
     fda2ea5 Commets on flatten_args_tc
     565ef4c Remove knot-tying bug in TcHsSyn.zonkTyVarOcc
     6dea7c1 Reject class instances with type families in kinds
     ed78951 make iToBase62's inner loop stricter in one of its arguments
     2e226a4 canCFunEqCan: use isTcReflexiveCo (not isTcReflCo)
     d1514e8 Remove duplicate "since" field in glasgow_exts.rst
     fa3143c Fix typos in -Wsimplifiable-class-constraints flag docs
     df363a6 Compiler panic on invalid syntax (unterminated pragma)
     a3a1a17 Add a test for Trac #15586
     2254912 testsuite: make CHECK_API_ANNOTATIONS and CHECK_PPR overridable
     24d610a Fix tests ghci057 and T9293. (#15071)
     c0e5087 Skip eventlog tests in GHCi way
     49d50b2 testsuite: Add test for #15368
     a811d93 base: Add references to Notes for certain special imports
     ecde954 testsuite: Use bools for booleans, not ints
     e29ac2d Expose 'moduleToPkgConfAll' from 'PackageState'
     1152a3b Define activeAfterInitial, activeDuringFinal
     3addf72 Preserve specialisations despite CSE
     16bc7ae Remove an incorrect assertion in threadPaused:
     c6fbac6 Fix a race between GC threads in concurrent scavenging
     d9a26c7 Various RTS bug fixes:
     4caad16 Documentation tweaks
     9400a5c ghc: Remove warning of StaticPointers not being supported by GHCi
     2b6694a users-guide: Disable syntax highlighting
     62cd440 Refactor Foreign.Marshal modules for more modern style
     510c5f4 Avoid creating unevaluated Int thunks when iterating in GHC.Foreign
     3cc3edf Update UnsafeReenter test
     d36b1ff Build debugged prof runtimes
     36740b4 Revert incorrect STM wakeup optimisation
     5d67d06 rts.cabal.in: advertise new default profiling ways for hadrian
     03b779f Make CoreMonad independent of TcEnv (#14391)
     ce23451 Refactor info table entry error messages
     0e6d42f Be a bit more aggressive about let-to-case
     7ab8007 Revert "ghc: Remove warning of StaticPointers not being supported by GHCi"
     5c48c41 template-haskell: Fix typo in changelog
     900c47f rts/Printer.c: always define the findPtr symbol
     b9b1f99 Honor INLINE on 0-arity bindings (#15578)
     1ad3c82 Typo in user guide wrongly claims DeriveLift was added in 7.2
     0c07208 Comments about join-point return types
     6bf11e6 Delete duplicated comment line
     291b0f8 Comments only (on IfDataInstance)
     bd76875 Allow (~) in the head of a quantified constraints
     0d4f394 Add regression test for Trac #15629
     02edb8f More info for Implication with -dppr-debug
     8533428 Remove dead variable binding
     9912cdf Fix build
     5f5898a eventlog: Factor out eventlog header generation into separate function
     e71e341 base: showEFloat: Handle negative precisions the same of zero precision
     ce240b3 Update hsc2hs submodule
     9c6b749 Add support for ImplicitParams and RecursiveDo in TH
     3040444 tests: increase (compile) timeout multiplier for T13701 and MultiLayerModules
     ecbe26b Fix T15502 on 32-bit
     64c54ff Mark system and internal symbols as private symbols in asm
     c23f057 Mark code related symbols as @function not @object
     ea5ade3 Coercion Quantification
     a3bce95 Correct submodule update for haddock
     c6bff52 Fix for #13862: Optional "-v" not allowed with :load in GHCi
     d1c2f29 Stable name comment wibbles
     88130db base: Add bangs to GHC.IO.Handle.Text hGet* functions
     43967c0 users-guide: Fix code-block layout for QuantifiedConstraints
     e655aac Make sure forM_ and related functions fuse cleanly
     5840734 Updated PE linker, section alignment and cleanup.
     4edc6d6 Users guide: EmptyDataDecls on by default
     01f7cd7 NoImplicitPrelude in ghc-boot-th, ghc-boot, ghc-heap, ghci
     ce3897f Fix check whether GCC supports __atomic_ builtins
     6bb9bc7 Invert FP conditions to eliminate the explicit NaN check.
     e40b388 Bump stm submodule
     989dca6 Bump text submodule
     2b763b5 Bump deepseq submodule
     1971e99 Don't shortcut SRTs for static functions (#15544)
     a4ae97e docs: fix example code
     45befe2 Use predefined known-key names when possible
     077b92f Remove -Waggregate-return when building RTS
     4e3f6a0 users guide: Fix a few issues
     ba086ca Add testcase for #14251
     d7fa869 Revert "adds -latomic to. ghc-prim"
     4eebc80 users-guide: Fix build with sphinx 1.8
     8c7d33a users_guide: fix sphinx error caused by non-explicit override
     a257782 user-guide: Allow build with sphinx < 1.8
     66c1729 Fix slop zeroing for AP_STACK eager blackholes in debug build
     29f1c55 Remove redundant slop zeroing
     d0d7484 testsuite: Don't force run of llvm ways in T14251
     73d9cad testsuite: Mark readFail032 and readFail048 as broken on Darwin
     3e5b8e3 testsuite: Fix readFail048 and readFail032 brokenness declarations
     fd89bb4 testsuite: Bump expected allocations of T9675
     78beade testsuite: Bump expected allocations for T12707
     7e77f41 testsuite: Bump T9630 expected allocations
     cad5d0b Buglet in reporting out of scope errors in rules
     4bde71d Don't look up unnecessary return in LastStmt
     ab44ff8 Comments only
     2dbf88b Fix get getIdFromTrivialExpr
     e68b439 Add a recursivity check in nonVoid
     d90946c Fix a MSG_BLACKHOLE sanity check, add some comments
     a38eaa6 aclocal.m4: fix shell comment syntax: '#', not '$'
     9bfbc4e Don't show constraint tuples in errors (#14907)
     2a9cead Add regression test for #15666
     a744134 Expand the Note on let-bound skolems
     4bdb10c Fix Lint of unsaturated type families
     d25fa45 Fix constant-folding for Integer shifts
     1d7b61f users' guide: document -freverse-errors
     d00c308 Fix for recover with -fexternal-interpreter (#15418)
     e72d788 Normalise EmptyCase types using the constraint solver
     c89297e Expose wopt_set/unset_fatal in DynFlags
     df67f95 Add -fkeep-cafs
     e44c992 Always check the relocation value for x86_64
     139ef7e CodeGen: Teach CodeGen about aliasing of XMM/YMM/ZMM registers
     99eb459 ghc-bin.cabal.in: add a 'threaded' flag for hadrian
     d157762 primops: Fix documentation of compactAllocateBlock#
     4578548 ghc-prim: Add missing changelog entry
     0ac86cb ghc-prim: Fix typo in traceBinaryEvent# changelog entry
     64475db circleci: Run slowtest with multiple threads
     309438e Fix #15637 by using VTA more in GND
     a57fa24 Quantify class variables first in associated families' kinds
     caffff1 circleci: Create missing test-results directory
     abfb91f resolve T13704
     e3355b7 rts.cabal.in: add more flags to control the extra flavours (for hadrian)
     21efbc7 GHCi should not filter instances involving cTuples
     a838ae3 Drop GHC 8.2 compatibility
     deceb21 Drop accidental write-attributes request
     3dedffa distrib: Remove mention of no-longer-existent make target
     fc2ff6d Make GHC (the library) flexible in the choice of integer library
     bd78985 Parse the (!) type operator and allow type operators in existential context
     e9e6640 Better -ddump-types
     43c2ffe Better comments and debug-print only
     e7ff934 Make Lint check that for CoVars more carefully
     02b303e Do not mark CoVars as dead in the occur-anal
     9ebfa03 Fail fast on pattern synonyms
     37ef703 Better pretty-printing of forall types
     2f09753 Distinguish Inferred from Specified tyvars
     d25519e tc-trace changes only
     60b547b Document the list data type
     feb8a67 Improve generated `GHC.Prim` docs
     8537657 Documentation fixes in 'template-haskell'
     bace26a Allow (unparenthesized) kind signatures
     ba163c3 Don't drop arguments in TH type arguments
     251e342 Set `infixr -1 ->`
     89656c2 Don't leak internal commentary into HasField's Haddocks
     fa1c827 Bump Cabal submodule
     817ba0c testsuite: Skip T3171 for now
     07083fc Add -Wstar-is-type to the User's Guide
     adcb5fb Multiple fixes / improvements for LLVM backend
     baec358 Update performance numbers on Windows
     98daa34 Fix PE linker wibbles
     e5013a5 Make TcRnMonad independent of TcSplice (#14391)
     2287257 Stable name type role
     8be27c0 Add a missing write barrier to small array writes
     4e3562c UNREG: don't prefix asm prefixes in via-C mode
     ed1615d testsuite: disable T14075 on non-smp targets
     6483ff9 testsuite: disable T10017 on non-smp targets
     32ceaaa testsuite: disable nursery-chunks1 on non-smp targets
     e4bec29 testsuite: disable T11760 on non-smp targets
     5d5307f Add Int8# and Word8#
     4eeeb51 update amd64 linux/osx stats for haddock.base perf test
     d728c3c Revert "Add Int8# and Word8#"
     ac97768 Fix dataToTag# argument evaluation
     2f693b3 Re-enable test T14251
     ce7a1c4 Support builtin classes like KnownNat in backpack
     05b2587 Comments about dataToTag# only
     5b2388b Include -fwarn-star-is-type in -Wcompat
     fc4c3df Fix dataToTag# comment syntax again (primops.txt.pp)
     68a747c rts: Stop tracing environment variables (fixes #15371)
     448b77b Add RubbishLit for absent bindings of UnliftedRep
     d52627f Minor documentation markup fix in HsExpr.hs
     8e6c34f Fix typo in documentation
     48efbc0 Fix #15725 with an extra Sym
     08b3db7 Use an accumulator version of tyCoVarsOfType
     8a9a63b Fix test for GCC support for atomics in Autotools
     f945b7a Correct typo "Deppendency" -> Dependency
     58dffa0 Deprecate -fllvm-pass-vectors-in-regs
     01c3d00 Fix plugin tests requirements
     a816ac4 Cleanup boot and validate
     846fe90 Typeable: Only render saturated tuple types with tuple syntax
     0b0cb48 Surprising error message with bang pattern
     26e81e9 Fix #12430 by expanding type synonyms in injTyVarsOfType
     c5b477c Fix cardinality change of fields in addDataConStrictness
     02b2116 Fix #15738 by defining (and using) parenthesizeHsContext
     95ec7c8 Generate correct relocation for external cost centre
     058c281 ghc-heap: Fix writing closures on big endian
     165d3d5 Enable -Wcompat=error in the testsuite
     104599f Add a RTS option -xp to load PIC object anywhere in address space
     8306141 Allocate bss section within proper range of other sections
     45ed461 Fix BLACKHOLE inspection in RtClosureInspect
     45d5eff Update integer_gmp_gcdext documentation.
     172b00c Add a strict version of foldMap to Foldable
     2e1df7c base: Fill in TBAs in changelog
     38c28c1 Fix #15761 by adding parens
     17b60f1 testsuite: Fix non-canonical Monoid instance in T3001-2
     46f2906 Fix T15729 in master
     879db55 Adding almost devoid check for covar in ForAllCo
     fce07c9 Update hsc2hs submodule to work around bug in response file handling.
     7521cc3 testsuite: Save performance metrics in git notes.
     bb48dcd -


More information about the ghc-commits mailing list