[commit: ghc] wip/aarch64-regd's head updated: Implement AArch64 codegen in `mkJumpToAddr` (for GHCi) (686720d)

git at git.haskell.org git at git.haskell.org
Thu Dec 17 21:53:47 UTC 2015


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

Branch 'wip/aarch64-regd' now includes:

     fe95463 ApiAnnotations: Add SourceText for unicode tokens
     ee91482 ApiAnnotations : ITopenExpQuote needs SourceText
     83b214d RtsFlags: Clean up stale CPP
     b8a849b users-guide: Limit column width
     69822f0 RtsFlags: Refactor some of the deeper switches
     7485d0c ghc.mk: Make install_docs rule sh-compatible
     82cf672 haddock.mk: Use \{1,\} instead of \+
     3773e91 Use TcM instead of it's expanded form, in TcSplice
     741cf18 Weaken monadic list operations to Applicative
     e2d9821 Data.List.isSubsequenceOf documentation clarification
     2d1a563 Implement support for user-defined type errors.
     3d88e89 s/FrontendMerge/FrontendInterface/g
     9193629 Move usage calculation to desugaring, simplifying ModGuts.
     ac1a379 Revert "Unify hsig and hs-boot; add preliminary "hs-boot" merging."
     df8169c Bump process submodule
     4e74ef9 T9181: Fix testsuite output
     615ba5f Remove orphan Functor instance of Data.Graph.SCC
     7c9cbfd template-haskell: drop `TemplateHaskell` requirement
     b3d6c0f Update Cabal submodule for new known extension
     8ad9e74 Make `timer_create(CLOCK_REALTIME)` autoconf test more reliable
     acce37f Fix archive loading on Windows by the runtime loader
     7b962ba Implement OverloadedLabels
     233d131 MonadFail proposal, phase 1
     98a4fa5 DynFlags: Don't list TemplateHaskell as supported if it's not
     11e336e More import related hints
     f405e1e Disable failed specialisation warnings by default & update documentation.
     f9e17fd Add -fwarn-missing-monadfail-instance to mkUserGuidePart
     6b3d5b5 rts: Kill PAPI support
     c945c90 base: Documentation for TypeError
     112ce87 docs: Ignore Sphinx doctrees produced by manpage build
     3ee0c14 Improve MonadFail errors by mentioning the pattern
     2f7e895 users-guide: Give links more contrast
     a0f977e relnotes: Update base version
     8eefdf0 users-guide: Use tango pygments style
     02eb44d users-guide: Fix typo in conf.py
     2d0e1db Comments only
     8e8d26a Comments on TcRnTypes.canDischarge
     07eb258 Refactor HsExpr.RecordCon, RecordUpd
     c61759d Fix inconsistent pretty-printing of type families
     cc79dd1 users-guide: Move <h1> outside of <a> tag
     971f2c9 Correct > to > in user's guide
     a41830f Mention "-XMonadFailDesugaring" in the docs
     a586622 Release Notes: Mention out-of-scope error message improvements
     2442038 Fix interaction of DuplicateRecordFields and GHC.Generics
     3e2a4ee Fix broken build-system when libffi uses install-sh
     65d7ff0 Make `derivedConstants` more crosscompile-friendly
     7dfde0e derivedConstants: Add support for AIX
     c5d8162 Make GHC aware of OSAIX and AixLD
     75036aa Set AIX specific CFLAGS flags
     fce0465 Unbreak Text.Read.Lex.lex on Unicode symbols
     d732ce0 Bump process submodule
     b72ca3e Pattern Synonym Documentation
     a689c8e ghci: don't let ctags/etags overwrite source files
     1994304 user's guide: Fix some accidental triple-` quote
     998c371 users-guide: Fix version number
     7e6dcf4 base: Delete errant GHC/Stack.hsc
     f40fe62 Follow-up fixup to c5d8162d230c373
     7f77e4e Fix Windows builds after D1242
     d585073 RtsFlags: Fix const warning
     192dd06 Suppress conflicting types for builtins warnings
     6664ab8 Add DVarSet - a deterministic set of Vars
     2325bd4 Create a deterministic version of tyVarsOfType
     b98ff3c Function definition in GHCi
     a703fbc Remove accidentally added T10359 blob
     4976ab2 Follow-up fix to 3e2a4eefbed7002437c3f (re #11109)
     638fde5 Add comment to Parser.y re extra API Annotation
     64737f2 New expected test output for 32 bit platforms
     3df9563 ApiAnnotations: Make all RdrName occurences Located
     6393dd8 Make abstractVars deterministic in SetLevel
     02c689c build.mk.sample: Document meaning of WERROR
     5d6cfbc Rip out Papi configure check
     7c9a04d Add a note explaining why every RdrName is Located
     dbad0d5 Libdw: Fix build on 32-bit platforms
     70ee638 Libdw: Fix initial register collection on i386
     36b2139 rts: Expose more libdw symbols
     a3a8ce6 rts: Add simple resource pool
     6fbf22d rts: Add LibdwPool, a pool for libdw sessions
     bb249aa base: Add Haskell interface to ExecutionStack
     7aaeaf8 Support multiple debug output levels
     40be909 Dwarf: Ensure tick parentage is preserved
     9471562 Output source notes in extended DWARF DIEs
     5955510 Improve constraint-used-as-type error msg
     70efb62 Add tests/monadfail/Makefile
     e587217 Add the rest of the notes for Located RdrName
     1c45f41 rts: Always export Libdw* symbols
     12dbc89 Add `PrelNames.thenAName` for `Applicative(*>)`
     f09f247 Implement new `-fwarn-noncanonical-monad-instances`
     c05fddd Rearrange error msgs and add section markers (Trac #11014).
     6d14793 Add -Wcompat warning flag group
     e506f02 Rewrite checkUniques and incorporate into validate
     8c5fe53 DynFlags: Update comments to reflect new users guide
     8dc6da8 Comments only
     5e04c38 Simplify the MonadFail code
     76f3142 DynFlags: Drop stale comment
     9032d05 update link to MonadFail proposal
     924f851 Refactor default methods (Trac #11105)
     e9a4c09 Comments only
     e913676 Add a simplifier trace for eta-expansion
     9aa9458 Note STM's vulnerability to non-allocating loops
     c7a058f User's Guide: Add links to MFP wiki page
     5699ac9 User documentation for DuplicateRecordFields
     d2a2d5e Note #11108 in the bugs section of users guide
     c4308b4 rts/Pool: Add poolTryTake
     1712a9e LibdwPool: Use poolTryTake
     ba14f04 Libdw: Handle failure to grab session for location lookup
     d25f853 Update transformers submodule
     49aae12 Check arity on default decl for assoc types
     583867b Update haskeline & terminfo submodules
     85fcd03 Implement new -XTemplateHaskellQuotes pragma
     72e3620 ghci: Add support for prompt functions
     55c737f ghc-pkg: print version when verbose
     399a5b4 Remove deprecated quasiquoter syntax.
     71c0cc1 GHCi should not defer typed holes
     54a9456 Update containers submodule
     616aceb Update deepseq submodule
     5897213 Remove redundant `#if`s
     f101a82 ghci: Refactor handling of :show
     bcd55a9 Some improvements on CoreToDos passed to plugins
     290def7 Implement warnings for Semigroups as parent of Monoid
     afb7213 MkId: Typos in comments
     14d0f7f Build system: Add stage specific SRC_HC_(WARNING_)OPTS
     6dce643 Fix grammar and typo in TcTyDecls
     36c1247 Remove duplicated line
     44c3e37 Fix warning about unused pattern variable
     b432e2f Make the determinism tests more robust
     1e041b7 Refactor treatment of wildcards
     218fdf9 Make the order of fixities in the iface file deterministic
     741f837 Implement more deterministic operations and document them
     52b02e6 Comments only (isIrrefutablePat)
     b564731 Comments (TcSMonad)
     d00cdf2 Revert "ghci: Add support for prompt functions"
     1caff20 StgSyn: Remove unused SRT constructor
     c75948b Move Stg-specific code from DynFlags to SimplStg
     d4d54b4 Remove *.xml from gitignore
     a12e47b Avoid panic due to partial ieName
     8cba907 Create empty dump files when there was nothing to dump
     0d1a2d2 ErrUtils: Spruce up Haddocks
     e7929ba Update bytestring submodule
     d25f3c0 users_guide/glasgow_exts.rst: fix link markup
     8a50610 Major Overhaul of Pattern Match Checking (Fixes #595)
     43a31fe testsuite: haddock.compiler: Bump expected allocations
     a034031 extending_ghc.rst: fix broken link (Trac #10950)
     c5597bb Revert "Create empty dump files when there was nothing to dump"
     7b29b0b Fix haddock syntax
     0dd61fe Kill redundant patterns
     934b3a0 Update test output
     40fc353 Bump hoopl submodule
     ae4398d Improve performance for PM check on literals (Fixes #11160 and #11161)
     99d01e1 Remove unused import in deSugar/TmOracle.hs
     7af29da Use Autoconf's AC_USE_SYSTEM_EXTENSIONS
     cd9f3bf RTS: Rename InCall.stat struct field to .rstat
     6ef351d On AIX we need -D_BSD defined in <Stg.h>
     d40f5b7 PmExpr: Fix CPP unacceptable too clang's CPP
     36a208f Use builtin ISO 8859-1 decoder in mkTextEncoding
     befc4e4 Check: More Clang/CPP wibbles
     e9220da Bump allocations for T783
     dc33e4c T5642 is broken
     96e67c0 T5642: Skip it entirely
     5b2b7e3 Make callToPats deterministic in SpecConstr
     1c9fd3f Case-of-empty-alts is trivial (Trac #11155)
     28035c0 Add derived constraints for wildcard signatures
     1cb3c8c Wibbles only
     822141b Make -dppr-debug show contents of (TypeError ...)
     1160dc5 Fix egregious error in eta-reduction of data families
     31b482b Minor refactoring of user type errors
     67565a7 Tidy user type errors in checkValidType
     43a5970 Comments only
     16aae60 T5642: Fix skip usage
     caa6851 testsuite: Rename pmcheck/T7669 to pmcheck/T7669a
     d4bf863 Update peak_megabytes_allocated for T9675
     020375d Add linter to check for binaries accidentally added to repository
     901cab1 lint: Add linter to catch uses of ASSERT macro that Clang dislikes
     c865c42 StgCmmMonad: Implement Outputable instance for Sequel for debugging
     e2c518e libdw: enable support only on i386 and amd64
     81cf200 pmcheck: Comments about term equality representation
     406444b pmcheck: Comments about undecidability of literal equality
     8f28797 Fix broken linters when using python3
     c714f8f Use git.h.o copy of arcanist-external-json-linter
     a14296c Temporarily disable external-json linters
     51d08d8 Enable non-canonical Monad instance warnings for stage1/2
     314bc99 ghc.mk: cleanup: use tab consistently
     d6512c7 ghc.mk: don't run mkUserGuidePart more than once
     13ab2c6 ghc.mk: fix docs re-rebuilding
     5f1e42f Allow to compile OSMem.c when MEM_NORESERVE is not available
     df67940 Make ghc.mk compatible with pedantic /bin/sh impls
     986ceb1 Implement new `-fwarn-noncanonical-monoid-instances`
     8b42214 Tweak use of AC_USE_SYSTEM_EXTENSIONS
     be92c28 Update hoopl submodule
     f5127c8 linters/check-cpp: Don't produce debug log
     3ea4fb7 Documentation: escape characters in template-haskell Haddocks
     42a5469 Ignore generated linter.log
     3d55e41 ghc-pkg: Restore old behavior in colored version; fixes 6119
     8cef8af Re-export data family when exporting a data instance without an export list
     91e985c Minor stylistic fixes in glasgow_exts.rst
     2110037 Add isImport, isDecl, and isStmt functions to GHC API
     d4bcd05 rts: Remove space before argument list in ASSERTs
     700c42b Use TypeLits in the meta-data encoding of GHC.Generics
     51a5e68 Refactor ConDecl
     1bd40c8 Move checking for missing signatures to RnNames.reportUnusedNames
     151c4b0 ghc-pkg: don't sort packages unnecessarily
     04e1c27 rts: One more Clang-unfriendly CPP usage
     0933331 Re-use `transformers`'s `MaybeT` rather than our own
     b292720 Remove redundant CPP conditionals
     834f9a4 Get rid of tcView altogether
     2f6e87a Introduce HasGhciState class and refactor use-sites
     9f4ca5a Associate ErrorCall pattern with ErrorCall type
     fd3b845 Make HasDynFlags more transformers friendly
     7a40a6c Update libffi-tarballs submodule to libffi 3.1 (re #10238)
     bb753c5 Rename s/7.12.1/8.0.1/ two minor occurences
     2cfa5db Fix double MaybeT instance
     2106d86 Fix typo sneaked in with fd3b845c01aa26b6e5
     69c3964 docs/glasgow_exts: Use warning admonition
     e792711 users_guide: Show sub-sub-sections in ToC
     aa6ae8a Comments only
     6c794c3 Comments about polymorphic recursion
     d7729c7 An assortment of typos
     7997d6c Refactor GHCi Command type; allow "hidden" commands
     31bddc4 Add missing whitespace in toArgs' error msg
     af77089 Fix DeriveAnyClass (Trac #9968)
     e9ea020 Comments only
     8317893 Improve documentation for DeriveAnyClass
     688069c More typos in comments/docs
     602889a Test Trac #11192
     f4f00c0 Test Trac #11187
     41ef8f7 Make sure PatSyns only get added once to tcg_patsyns
     f7c17c8 T7478: Don't expect broken on Darwin
     5447c20 Mark retc001 as broken on Darwin
     262954c T4801: Update expected allocations on Darwin
     c205aeb Removed colon append operation (fixes #10785)
     b138248 Improved data family export documentation
     ceaf0f4 testsuite: Only run recomp015 on ELF-based platforms
     6e56ac5 Fix infix record field fixity (#11167 and #11173).
     6746549 Add kind equalities to GHC.
     5183109 Revert README.md changes from 6746549772c5
     a6e0394 haddock: Fix submodule commit to point to ghc-head
     b5d5d83 Revert .gitmodules changes from 6746549772c5
     a459451 rm rae.txt
     68f198f Test case for #7961.
     779dfea Test #9017 in polykinds/T9017
     a3c2a26 Frontend plugins.
     1883afb Implement -fwarn-missing-pat-syn-sigs
     3ec8288 Rework the Implicit CallStack solver to handle local lets.
     4935b48 Make -XStrict imply -XStrictData
     3640ae9 Dwarf: Use .short instead of .hword on Darwin
     aaed24a Build system: fix 'make install-strip' in bindist
     9934819 Refactor type families in Template Haskell
     59cc6ed Fix release notes markup
     669c5ed Remove redundant imports
     f48015b configure: add support for 'sh4' (Trac #11209)
     0bf0cf9 Update Cabal submodule
     fcc6b1d Use idiomatic way to tell Autoconf the c compiler
     baed2f5 Don't pass CC= explicitly to `./configure` scripts
     65920c9 Some more typos in comments
     04ab55d Use Cxt for deriving clauses in TH (#10819)
     023f11f Suggest import Data.Kinds when * is out of scope
     419b6c0 Make binds in do-blocks strict when -XStrict (#11193)
     59d3948 Add testcase for #11216
     402bbe6 Add IsString Outputable.SDoc instance
     05fe546 Test #9632 in dependent/should_compile/T9632
     ddde542 DynFlags Remove -fwarn-context-quantification flag
     9017f16 Mention "handle is semi-closed" in error messages
     05a5ebe Fix runghc when $1_$2_SHELL_WRAPPER = NO
     6d9c18c DynFlags: remove Opt_Static
     33742db DynFlags: delete function that doesn't do anything
     f4dd486 Document -XOverloadedLabels
     8e6f9bf TysWiredIn: Fix a comment - Note [TYPE] is in TysPrim
     4c9d1ea Update expected test output for 32 bit platforms
     f4d90f9 Reset process submodule to v1.4.1.0 release tag
     d1ca5d2 Fix formatting complaint from Sphinx
     98cdaee Improve documentation for -XStrict
     b8ca645 Comments on equality types and classes
     6eabb6d Allow recursive (undecidable) superclasses
     947e44f Comment layout only
     e2c9173 Narrow scope of special-case for unqualified printing of names in core libraries
     758e6b3 base: NonEmpty: Fix documentation example
     a701694 Add testcase for #11224
     28638df primops: Mark actions evaluated by `catch*` as lazy
     c1e2553 Expose enabled language extensions to TH
     50c795c Update pretty submodule to v1.1.3.2 release
     3a48e6e Update binary submodule to binary-0.8 snapshot
     2206fa8 Add `-W(no-)xxx` aliases for `-f(no-)warn-xxx` flags
     437ebdd Start using `-W` instead of `-f(no-)warn` in some places
     d36e9e1 GHC.Stack: Fix Haddock markup
     4c7da9c Update haddock submodule
     ab79ed7 Improve detection of `fdatasync(2)` (re #11137)
     11b9ada Synchronize Haddock submodule with master branch
     efaa51d Look through type synonyms in GADT kind signatures
     046b47a Note [The equality types story] in TysPrim
     b35cc1f Update Cabal submodule to latest snapshot
     1687f99 Update transformers submodule to latest v0.5.0.0
     6c9258d Add test for #10897
     7221ad7 GHC doesn't have a way to ask for user-package-db, so Cabal reimplemented it.
     4905b83 Remote GHCi, -fexternal-interpreter
     a6d664c accept output
     dd3837a Fix tests when run in parallel
     acd447e Bump haddock expected performance numbers
     b20a65d testsuite: Add missing LiteralsTest2.hs
     786d528 TcTypeable: Don't use bogus fingerprints when suppress-uniques is enabled
     62e60bb Fix haddock hyperlinker
     27f47cd Fix libffi dependency, and remove redundant LibFFI.hsc
     0cc4aad Build system: Cabalize genapply
     86ad116 Add Shake configuration to configure.ac
     109d847 Build system: Make cGhcRtsWithLibdw flag a proper Bool
     e58a936 rules/haddock: Add EXTRA_HADDOCK_OPTS flag
     4f870f8 Conditionally show plural "s" in warnings
     cab1316 Fix #11232.
     4b161c9 Reify DuplicateRecordFields by label, rather than by selector
     d3dac4e Add -fprint-typechecker-elaboration flag (fixes #10662)
     575f0ad users_guide: Remove extraneous vertical whitespace
     e7f22bf Improve pretty-printing in pprIfaceIdBndr
     e32c2e1 Remove unused T10524.stderr
     89d70f9 Update Cabal submodule
     aee58e1 T9961 allocations crept further upwards
     e2e24f2 Disable recomp015 on ARM
     ece8aff Remove warning-suppression flags for Cabal
     a2f04a2 Testsuite: #10712 is fixed
     9d9c534 Lexer: update outdated comments [skip ci]
     1b6323b IO Handles: update comments [skip ci]
     ae86eb9 Fix tcTyClTyVars to handle SigTvs
     1722fa1 Fix #11230.
     c1bd3d4 Build system: also put scripts in libexecdir/bin
     272e1cc Testsuite: allow spaces in TEST_HC passed in by the user
     116ba5e Build system: allow bindist without docs
     f1fa383 Suppress warnings when compiling primitive and random
     bc436f9 Testsuite: mark frontend01 conditionally expect_broken on #10301
     e0e03d5 Move Data.Functor.(Classes,Compose,Product,Sum) into base
     f13bf92 rts: Fix clobbered regs list for aarch64 StgRun
     e404cb5 configure.ac: AArch64 is now registerised
     c8e36e2 rts/StgCRun.c: Add d15 to clobbered regs
     728d57b Linker: WIP on supporting Arm64/AArch64
     686720d Implement AArch64 codegen in `mkJumpToAddr` (for GHCi)


More information about the ghc-commits mailing list