Repository : ssh://darcs.haskell.org//srv/darcs/ghc

Branch 'type-nats' now includes:

     0741ca5... Fix another bug in CorePrep eta-reduction (fixes Trac #5915)
     26c9623... Improve error message when interpreter is not enabled (Trac 
#5919)
     c1ea823... Remove debug trace
     54eb030... Deal with kind variables brought into scope by a kind signature
     55372bc... Add fixity declarations to Template Haskell (Trac #1541)
     23b27e2... Improve debug WARNING message
     3f96882... Merge branch 'master' of http://darcs.haskell.org//ghc
     9827c21... Merge branch 'master' of http://darcs.haskell.org//ghc
     27e3bd8... Merge branch 'master' of http://darcs.haskell.org//ghc
     ca7c3a0... Merge branch 'master' of http://darcs.haskell.org//ghc
     b857c8a... Refactor HsDecls.TyClDecl to extract the type HsTyDefn, which 
is the RHS of a data type or type synonym declaration.  This can be shared 
between type declarations and type *instance* declarations.
     d9ee9d9... Merge branch 'master' of http://darcs.haskell.org//ghc
     e5beffb... Complete refactoring of HsDecls/HsTyDefn
     a44c3d9... Make the 'extract' functions to find free type variables of an 
HsType return RdrNames rather than (Located RdrNames).
     6403540... Merge branch 'master' of http://darcs.haskell.org//ghc
     673b1be... Remove dead code
     5673173... Merge with HEAD
     4ecfc7f... Remove Show instance for Forest
     cc2d2e1... Midstream check-in on    (i) Replaced a lot of clunky and 
fragile EvVar handling code with        a more uniform ``flavor transformer'' 
API in the canonicalizer        and the interaction solver. Now EvVars are just 
fields inside        the CtFlavors.    (ii) Significantly simplified our 
caching story This patch does not validate yet and more refactoring is on the 
way.
     9606231... Don't document '-fregs-liveness' or '-fllvm-tbaa', both hidden 
flags
     516d313... Add a crucial forkM on the superclass context of IfaceClass in 
tcIfaceDecl
     b4b7647... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     cb5a3f2... Make the LocalRdrEnv keep track of all the Names that are in 
scope
     59d6d62... Merge branch 'master' of http://darcs.haskell.org/ghc
     734f1d4... Fix a bug in threadStackOverflow() (maybe #5214)
     fe0a45e... threadStackOverflow: Tweak to stack chunk sizing
     c6411c3... Slightly more informal message when EvCast fails.
     3be60fa... Bugfixes: (i) wrong evidence generetation when using cached 
solved family equation           (ii) evidence loops because of caching fixed
     4e0f1a0... Small bugfix (for indexed_types/should_compile/T2291.hs). 
Because our inert sets do not tolerate more than a single constraint per family 
head we have to allow family interactions /with the inerts/ (not with 
top-level) when the context says simplEqsOnly.
     1cc92e9... defaultKind the kind of one of the types when you create a 
higher-dimensional equality proof, pretty much as we do for mkTcEqPred. Ugly 
and delicate but we have to rething the subkinding story. For now I am doing 
the same thing as mkTcEqPred.
     81faaee... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     bf334d2... Add handling of LitTy. Still a TODO to deal properly with the 
forall case in there.
     e74fbf0... Started investigating how performance is affected and how 
intensively our caches are used.
     f30f90b... More informative commentary as to why we allow family 
interactions with inerts when simplEqsOnly is on.
     3f42011... Changing the orientation of a generated equality
     f84ea58... Deleting A LOT of commented out code!
     b22501b... Add linker support for ELF on ARM
     f1f93b2... Comments only
     f0cb41b... White space only
     dd847cb... Don't crash if there's a malformed instance!
     e21e13f... A related group of changes that make lexically scoped type 
variables work in Template Haskell
     4dd0fd3... Don't do validity checking on types in Template Haskell type 
brackets We might be in the "knot" of a type declaration: see Trac #5968.
     9804c81... Merge branch 'master' of http://darcs.haskell.org/ghc
     d86e6c0... A little tracing.
     ac2fbb4... Update documentation of DatatypeContexts (#5964)
     83d9b38... Attempt to detect loops through imported function RULEs
     6785820... Mostly commentary to follow up after discussions with SPJ on 
several open tickets.
     a39a192... Respect package qualifier when validating imports in GHCi 
(#5979)
     853c1c3... Add some missing equations for type-literals.
     d402d8a... Add an entry for -XExplicitNamespaces to the manual.
     0571092... Add a section about promoted literals to the manual.
     027f282... Tidy up compiler/ghc.cabal.in
     270b7ce... Whitespace only in main/Packages.lhs
     b3f6a8b... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     50e5a06... Fixed typo in b857c8ad which caused NewtypeD to be interpreted 
as DataD.
     dc2f65f... Support qualified identifiers in quasi-quotes (#5555).
     8580b97... Deleting more old commented code.
     5802ebd... Dropping the idempotence restriction on the inert substitution, 
for efficiency. More documentation to follow.
     f9da524... Commentary, following the relaxation of idempotence of the 
inert substitution.
     e7e5e27... Prevent nested TH exceptions from bubbling up to the top level 
(#5976)
     d29e277... Bugfix in emitKindConstraint (must not cache orig constraint as 
Solved!); added short note to document an example.
     8737d47... When rewriting a flavor with rewriteCtFlavor, in the case of 
reflexivity, avoid setting the flavor PredType to be the new PredType if the 
types exactly match, so that in case of failure we report errors that do not 
have expanded type synonyms.
     2183c87... More informative tracing for ddump-cs-trace
     e3e740d... Wibble: using original type for the dictionary if it has not 
changed (to preserve synonyms)
     88d61cc... Improved checks for "dynamic" and "wrapper" foreign 
declarations (#5664)
     30eee19... Update comments about Addr in foreign declarations.
     4f7599d... Tighten up on type validity checking
     4d20dc8... Merge branch 'master' of http://darcs.haskell.org/ghc
     d3020a7... Adding a forgotten pre-canonicalication cache-lookup stage.
     0dd6cc5... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     4caef1c... Document optimisation passes, to some extent at least
     022c1d2... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     f9c2e85... Add eventlog/trace stuff for capabilities: 
create/delete/enable/disable
     8536f09... Calculate the total memory allocated on a per-capability basis
     cd930da... Change the presentation of parallel GC work balance in +RTS -s
     65aaa9b... Add new eventlog events for various heap and GC statistics
     a3cdefd... Adjust the eventlog description header for the spark counter 
event
     e88f162... Move trace of cap delete from shutdownCapability to 
freeCapability
     1f809ce... Emit final heap alloc events and rearrange code to calculate 
alloc totals
     598109e... Fix the timestamps in GC_START and GC_END events on the 
GC-initiating cap
     c294d95... Add the GC_GLOBAL_SYNC event marking that all caps are stopped 
for GC
     2bf6083... Fix uneeded test in safe haskell code
     c690214... Fix tracking of reason safe inference failed. (#5988)
     7ed6759... Update safe haskell error/warn formatting
     5a0b827... Fix GHC API with respect to safe haskell. (#5989)
     7f61ae2... --amend
     1a4ae30... Merge branch 'master' of http://darcs.haskell.org/ghc into 
ghc-new-flavor
     f7245ce... White space only
     6d46439... Improve error reporting for out-of-scope variables
     70b0f16... Improve kind-checking of type splices slightly
     0125965... Merge branch 'master' of http://darcs.haskell.org//ghc
     6100eb4... Fix Trac #5952, by changing the Outputable TyCon instance, so 
that it does not print a quote in front of a promoted TyCon in a Kind.
     b40f001... Merge branch 'master' of http://darcs.haskell.org/ghc
     806182b... Implemeting a lookup modulo non-idempotent substitution.
     f15977c... Improved caching: I was flushing the solved when going under 
implications, this was the reason for the regression of T3064.
     3f46b1e... Merge branch 'master' of http://darcs.haskell.org/ghc
     f0d10e3... Allow promoted constructors in the typedoc production (#5948)
     1bfb979... Update names to match the implementation in GHC.TypeLits.
     2d8374a... Updates to the constraint solver to be able to handle 
implication constraint generation during solveInteractCts, needed for polytype 
equality decomposition. More commentary to follow.
     da102b3... Fix RTS build on OS X
     81f19d6... Setting empty touchable range in implications that are 
generated from polytype decomposition in the constraint solver.
     1603e4f... Merge branch 'master' of http://darcs.haskell.org/ghc

_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to