[commit: ghc] wip/T8322's head updated: Attempt to load all modules before reporting errors (aa8ec9e)

git at git.haskell.org git
Sat Oct 5 18:16:21 UTC 2013


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

Branch 'wip/T8322' now includes:

     f4046b5 Change role annotation syntax.
     53b2dc8 Suppress unused variable when OS does not support setuid.
     d80bd87 Fix-up Docbook XML broken in f4046b508a5a7
     b6bc326 Limit upper versions of Alex and Happy
     bd42c9d Implement checkable "minimal complete definitions" (#7633)
     b626989 Tweaks to release notes If someone also feels that credits should better go into the release announcement, just nuke the last line of that paragraph.
     7a4c15a Add flag to control loopification
     a5bdc6b A little refactoring
     8cfbdcc Accommodate Derived constraints in two places (fix Trac #8129, #8134)
     62c4058 Optimise (case tagToEnum# x of ..) as in Trac #8317
     03e44ee Tidy up and refactor overflow checking for literals
     6eec7bc Trailing whitespaces
     53948f9 Restore old names of comparison primops
     9078408 Comments only
     de4090b Make Word# a wired-in TyCon (fix Trac #8280)
     07f524c Fix egregious blunder in extractRelevantInerts
     17ba306 Remove trailing whitespaces in flags.xml
     291cb85 Document -floopification flag in user guide
     4916552 Update release notes for new comparison primops
     d85550e Comments only
     d57f2ad Ignore Tickish Breakpoints when serialising Core into interface files
     e17072d Refactor AMP warnings a bit
     3462534 Kill Type.isKindTy in favour of Kind.isKind (same code)
     15dc80e Nuke tc-trace that makes the typechecker loop
     86033a0 Improve error message for deriving polykinded Typeable (Trac #7800)
     d545b46 Comments only
     2fbfa11 Update `Cabal` to 1.18.1 final
     ffa8d22 Typos
     96cfb11 Fix name of vanilla RTS way in the user's guide
     da11bb1 Document more stolen syntax (#4196)
     1320fd2 Add release note entry for `{-# MINIMAL #-}` (#7633)
     efb9e82 Document remaining GHCi commands in users_guide (#7501)
     ea2af9b users_guide/ghci: Whitespace cleanup (#7501)
     6f79989 Restructure compilation pipeline to allow hooks
     6e6e6f5 Release note blurb.
     bdcf210 Ensure that globalRegMaybe returns accurate information for XMM registers.
     e02c506 Do not assume that XMM registers are used to pass floating point arguments.
     0f89b9e Enable passing vector arguments in xmm registers on x86-32.
     da5a647 Do not expose LLVM-only primops in GHC.PrimopWrappers.
     16b350a SIMD primops are now generated using schemas that are polymorphic in width and element type.
     638cd12 Flesh out 128-bit wide SIMD primops.
     0c6cf2a Add support for -mavx and -mavx2 flags.
     9d47e58 Add Cmm support for 256-bit-wide values.
     e074c1c Add support for 256-bit-wide vectors.
     afdb2fc Set LLVM option -stack-alignment=32 when compiling AVX instructions.
     f8c5167 Fixup stack spills when generating AVX instructions.
     0b561f1 Pass 256-bit-wide vectors in registers.
     7624815 Add 256-bit-wide SIMD primitives.
     03e33c9 Add support for -mavx512* flags.
     49f4c12 Add Cmm support for 512-bit-wide values.
     26a960c Add support for 512-bit-wide vectors.
     c5add86 Pass 512-bit-wide vectors in registers.
     7dda67b Add 512-bit-wide SIMD primitives.
     d2b9526 By default, only pass 128-bit SIMD vectors in registers on X86-64.
     1ed36c5 Enable -msse to be specified by itself.
     25eeb67 Check that SIMD vector instructions are compatible with current set of dynamic flags.
     680441d Merge branch 'wip/simd'
     e19ae5d Catch potential garbage after -msse.
     be3b84f Typos
     f5879ac Discard unreachable code in the register allocator (#7574)
     1908195 Fix linker_unload now that we are running constructors in the linker (#8291)
     93a04b4 Remove fglasgow-exts from ghci --help
     84dff71 Fix the definition of cas() on x86 (#8219)
     9c11fdb Fix build when PROF_SPIN is unset
     e2da02d Release notes: mention instance Monad (WrappedMonad m) (#8218)
     5cf3669 Add a type-function for subtraction.
     1c0a8e0 Typo in comment
     94ab5d2 Fix user guide documentation about unboxed values
     5e2f145 Update `primitive` and `vector` packages
     1711208 Implement an unlifted Proxy type, Proxy#
     f712751 Make typeRep_RDR use typeRep# instead of typeRep
     c4ffdba Fix manual regarding current state of implicit quantification
     fa3ffb4 Release notes: mention -XEmptyCase
     683f4b7 Whitespace only.
     fd9a9ab RnNames.lhs : Reuse existing function.
     8634935 Fix typo in sync-all script. (#8375)
     0481e07 Teach sync-all how to rewrite submodule repo urls
     7f23a5d Make lazy unlifted bindings an error by default.
     3bd7861 Fix BCO bitmap generation on 32-bit platforms (#8377)
     d664f8b Remove extra space in LIBFFI_CFLAGS (#8349)
     cb83365 Add a note about Proxy# to the user guide
     bb3f7b0 Mention the Foldable and Traversable instances for Const r in the user guide
     b9127f4 Fix AMP warnings for explicit Prelude imports (#8004)
     6c235b5 Compare against pRELUDE_NAME instead of "Prelude"
     4b8a928 Typos in users' guide
     56084d7 Expand the commentary in Note [syntax of cmm files]
     11b5ce5 Remove use of R9, and fix associated bugs
     cb7785f use a nat, not StgWord8, for gc_type
     0b0fec5 use StgWord not StgWord8 for wakeup
     2f69aae Globally replace "hackage.haskell.org" with "ghc.haskell.org"
     ab3abf1 grammar fix
     9bbbf26 Remove a couple of unnecessary/outdated references to HBC
     2798a17 Clarification in the docs for INLINE
     c0f89a1 Add back a comment that got lost
     aab6560 Add layout to MultiWayIf (#7783)
     3c9aa40 comment update
     9bd3666 Lift an unnecessary assumption in the demand analyser (fix Trac #8329)
     36035d8 Better docs for MINIMAL
     e276ed7 Comments only
     96f33e6 Move defaultClassMinimalDef from BuildTyCl to TcClassDcl
     badbbe0 Comments only
     4407614 Look inside tuple predicates when checking instance declaration contexts
     bceeb01 Improve error reporting of fundep coverage condition failure
     66c5ddb Improve pretty-printing of types
     60d17a3 Remove trailing whitespace and tabs
     63f2eee Documentation for -fprint-explicit-foralls and -fprint-explicit-kinds
     ff07927 Wibble (change of flag name)
     259e1ae White space and line endings
     b8a4085 Improve error message for fundeps a bit more
     d6ccea9 Typos in comments
     4a14326 Delete old comments referring to newSession
     bc8a5e1 Persist annotations to interface files (#3725)
     70ccf23 fingerprint.py: Invoke 'perl' manually (#8283)
     627d1e0 Add TH support for annotations (#8340)
     fd74014 Add support for prefetch with locality levels.
     5af8ae5 Release note updates.
     a15ece4 Remove glasgow-exts from :help
     986250e Update manual regarding unboxed tuples
     b84fbab Initialize gc_thread.mut_spin to the 'acquired' state
     9864edf Look through tick-boxes when looking for integral literals in the desugarer
     7996d8f Tidy up the commit for Trac #3725
     43856a0 Improve -XAllowAmbiguousTypes (Trac #8392)
     7e44480 Tiny comment on the change from StgWord8 to StgWord
     9d908c5 Close over kinds when checking fundep coverage (Trac #8391)
     0c7d2d7 Fix Trac #8368.
     4f85aab s/Heep/Heap/
     0773f76 s/pathalogical/pathological/
     30a046f Update `bytestring` library to latest upstream HEAD
     429397f Comments only
     1de7975 Wibble in user docs
     a9649c4 Fix the bytecode genreation for tagToEnum# (Trac #8383)
     da46a00 Improve pretty-printing of IfaceSyn type families
     acccbf3 Simplify PprTyThing
     8755758 Simplify printing of boot-file mis-matches, by using PprTyThing.pprTyThing
     8d82954 Comments and white space only
     1745779 Simplify the plumbing for checkValidTyCl
     22818ab Move renamer splice functionality into a separate module.
     0cc2bb5 Consolidate TH renaming.
     6af0bd8 Add syntactic support for typed expression brackets and splices.
     96456c6 Add names for TExp type constructor and unType.
     639714b Differentiate typed and untyped splices and brackets in the abstract syntax.
     459a03e Track the typed/untyped distinction in the current TH stage.
     d0d47ba Check the staging restriction in the renamer.
     e036ddc Track TH stage in the renamer.
     96c6fa0 Add support for typed brackets and splices.
     1e6a941 Clean up error context when checking brackets/splices.
     047b3b8 Clean up smart constructors for splices.
     db6cb11 Add support for pattern splices.
     5246e12 Add full support for declaration splices.
     9145629 Code formatting cleanup.
     cb44123 Allow splices to add additional top-level declarations.
     c6033dc Change the types of typed brackets and splices.
     2d1b4a7 Add support for Template Haskell module finalizers.
     5e1fda8 Add support for Template Haskell state.
     e7394be Merge New Template Haskell branch.
     d5075dc Remove tab.
     aa8ec9e Attempt to load all modules before reporting errors



More information about the ghc-commits mailing list