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

Branch 'overlapping-tyfams' now includes:

     cb07cb7... Always define startProfTimer and stopProfTimer
     c4d75a7... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     7299487... Follow RTS symbol changes in Linker.c
     4e6bd65... Use the right arch name in the Windows installer filename
     a0e308d... Don't pass -Wimplicit to the C++ compiler.
     7473c3d... Update 'unboxed tuples' section of users guide.
     f78b31a... Fix ambiguous flag resolution (#7138)
     8240843... Respect verbosity for "flags changed" message (#7139)
     82373c7... Give suggestions for unrecognised command line arguments
     700d287... Fix environment update for type instance declarations in GHCi 
(#7117)
     3e6c930... Fix GHCi segfault during startup on linux-powerpc (#2972).
     e6fa845... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     e949162... Fix Trac #7128, by zonking kind varaibles more assiduously when 
typechecking a class declaration
     111ff8c... Comments
     b10eb00... Better debug printing
     3fabf48... Document -fdefer-type-errors
     ca9986a... Improve documentation of the way that defaulting to IO happens 
in GHCi
     55cdcc9... Make .t files when running haddock
     1993ee4... TH: Pragmas refactoring.
     af9dd9d... Comments about shadowing
     10377bb... Fix Trac #7145, by recording uses of constructor "children" in 
export lists
     c848891... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
     bdce8f0... Put kind variables before type variables when quantifying
     72e7f57... Require DataKinds for promoted list/tuple syntax in types
     f7b096e... Test FlexibleInstance not UndecidableInstances in the ambiguity 
check
     de07bf2... Use TcMType.growThetaTyVars (which works) rather than 
TcSimplify.growPreds (which doesn't)
     41c7342... Allow a vew pattern or bang pattern in a record pattern.
     00a2104... Improve documentation for rank-1 types (Trac #7137)
     3eb6e21... When pattern matching against a constructor with equalities, 
require either -XGADTs *or* -XTypeFamilies (rather than only the former)
     4e0a957... Profiling: open .prof when -hr<cc> is specified
     a874dd8... Export startProfTimer and stopProfTimer symbols.
     d421b16... Avoid the quadratic append trap in flattenCmmAGraph
     0ca7574... remove tabs
     9825f86... remove tabs
     2fe4dbc... remove tabs
     cec899d... Retain ordering of finalizers during GC (#7160)
     106f043... add X86_64_GOTTPOFF relocation for errno
     bb120df... move startProfTimer() and stopProfTimer() to the public headers
     bbb5843... Fix a discrepancy between two calculations of which generation 
to collect
     0a7c5b8... improve debug output
     a68df77... Reduce fragmentation when using +RTS -H (with or without a size)
     4752385... Improve compile times by enabling +RTS -H for GHC (only when 
bootstrapped)
     397606d... tidy up
     d4ac7d8... Fix inverted test for platformUnregisterised (should fix the 
optllvm breakage)
     2f7c578... Reduce the likelihood of x64/x86-64 changes breaking the build 
on other arches (#7083).
     2c6d11f... Re-jig the reporting of names bound multiple times
     1a591a0... Refactor the way we infer types for functions in a mutually 
recursive group
     68a1393... Annotate code in {-# LINE #-} pragmas as well
     2c60015... fix warning
     e590ad7... OS X: use mmap() instead of malloc for allocating the bss 
(#7040)
     6d3fb1b... Fix the generation of CallerSaves; fixes #7163
     07295e9... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     7570064... Move activeStgRegs into CodeGen.Platform
     15856e9... Add haveRegBase to CodeGen.Platform
     80a72da... CgUtils no longer needs to #include HaskellMachRegs.h
     cacae06... Whitespace only in StgCmmUtils
     dbc0560... Use haveRegBase in StgCmmUtils too
     d182285... StgCmmUtils no longer needs to include HaskellMachRegs.h
     ac21fdb... Pass platform down to lastxmm
     b6b6311... Pass platform down to lastint
     eb9b4e5... Remove unused 'targetWordSize'
     7252309... Whitespace only in nativeGen/RegAlloc/Linear/X86/FreeRegs.hs
     98c29f9... Whitespace only in compiler/nativeGen/PPC/Regs.hs
     a3d77e8... Make the PPC globalRegMaybe more similar to the other platforms'
     23efe66... Remove some CPP in nativeGen/X86/Regs.hs
     f1f1659... More CPP removal in nativeGen/X86/Regs.hs
     f26027e... More CPP removal in nativeGen/X86/Regs.hs
     a0788a8... Fix missing case in coVarsOfTcCo
     61cc04d... A bit more debug output
     6f96bc4... Tab elimination
     948be9c... Add mapTM to TrieMap
     2b5b178... Improve Safe Haskell warn/error output.
     93e8ae2... Fix :issafe command (#7172).
     e8e9d09... Minor refactoring
     9a3c8bd... Emit a warning for -rtsopts -shared, as well as -rtsopts 
-no-hs-main
     d6918e9... Don't assume that coercion variables have (~) types
     b4b7863... Fix for optimizer bug on linux-powerpc (#6156).
     da9a330... Merge ../HEAD
     0440d8a... Follow changes in Cabal
     ad33998... Fix to-iface conversion of RULES involving coercions in 
argument pattterns
     b04ff2f... Two small fixes to SpecConstr for functions with equality-proof 
args
     2f08f70... Don't specialise on implicit-parameter arguments in Specalise
     336a769... Merge branch 'master' of http://darcs.haskell.org/ghc
     cc1cc09... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     75f2e87... Fix build with FreeBSD versions earlier than 9.0
     8413d83... Make a function for get_itbl, rather than using a CPP macro
     6252300... Convert a couple more macros to inline functions
     9959dee... More CPP macro -> inline function
     773570e... More CPP macros -> inline functions
     0ab537c... More CPP macros -> inline functions
     3d7c81a... Make badImportItem into a warning (#7167)
     4eb02c1... Update documentation for -fwarn-dodgy-imports.
     d82cecb... Fix return type of FUN_INFO_PTR_TO_STRUCT.
     1d36d88... Fix callerSaves, activeStgRegs, haveRegBase when unregisterised
     c0849d8... Fix -fPIC with the new code generator
     0e7d290... generalise the type of eqStableName#
     b2e8bed... Fix Trac #7092, involving Template Hsakell and name shadowing
     ab2fe55... Comments in CoreSyn only
     7dfbed2... Fix pretty-printing for GADTs in infix form
     1bbdbe5... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
     c0907ed... Move more code into codeGen/CodeGen/Platform.hs
     dae766b... Remove some old commented-out code
     152f1eb... Remove some CPP from nativeGen/PPC/Regs.h
     6a43ff8... Remove some CPP from llvmGen/LlvmCodeGen/Ppr.hs
     a94b80b... Remove Util.{isDarwinTarget,isWindowsTarget}
     350b5c4... Remove some CPP from compiler/ghci/Linker.lhs
     ed8d7a1... Remove some CPP from nativeGen/X86/Instr.hs
     737e444... Whitespace only in cmm/CmmParse.y
     915c372... Remove CPP from cmm/CmmParse.y
     baa7c0f... Add DynFlags to the CorePrepEnv
     4144896... Remove CPP from coreSyn/CoreUtils.lhs
     72e46ba... Merge branch 'master' of http://darcs.haskell.org/ghc
     f27c631... Fix Trac #7196 by adding a case to the desugarer
     d0ddde5... Fail earlier if there's an error in a type declaration
     bcef1e2... v7.4.1 is required for building, so we can drop the v7.2.1 
workaround
     b660cc0... make sure to remove the right link before calling 'ln -s' 
(could we use 'ln -sf'?)
     8aabe8d... Fix fencepost and byte/word bugs in cloneArray/copyArray (#7185)
     de3a8f7... Cleanup: add mkIntExpr and zeroExpr utils
     832077c... enable -fnew-codegen by default
     4f656e8... disable -fregs-graph (#7192)
     6dd55e8... Fix a bug in foldExpDeep
     d9c0276... small improvements to findPtr() and the closure printer
     7eff304... debug printing of the CAFEnv
     08042a5... fix the name of an SCC
     fad7453... Narrow the arg of popCnt# to the correct width
     111edd8... Add -fcmm-sink to avoid the register allocator failing on x86
     db5c6ad... Load the PIC base register on every entry point
     6def8bc... Disable the MR by default in GHCi (#3202)
     494eb3d... Refactor the ways code a bit
     46258b4... Make the ways dynamic
     4f15146... Define initial buildTag and rtsBuildTag
     da33622... Remove doingTickyProfiling
     92f0991... Remove the way-related CPP frmo DynFlags
     3b56334... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     61d41b9... Move ldInputs into DynFlags
     3d3fef8... Remove the unused opt_StubDeadValues
     892d862... Make -fhistory-size dynamic
     056b27b... Remove -dstub-dead-values from flag list
     af4f987... Remove unused -dopt-fuel
     7b11baa... Make -fhpc a dynamic flag
     e641139... Narrow the args of the popCnt# primitives (new codegen)
     bd5354e... Fix -split-objs with the new code generator
     ccf44d8... A further fix for -split-objs with the new codegen
     c655913... remove $(GhcStage1DefaultNewCodegen) etc.
     583c87d... Fix #7215: we weren't calculating the hashes correctly for 
sub-binders
     62da65a... Fail nicely when encountering an invalid bang annotation (#7210)
     d8b48ba... Typo fix in deferred type errors docs.
     8224ee1... Fix the PPC and SPARC NCGs to handle multiple info tables in a 
proc
     d68865d... memInventory(): tweak pretty-printing
     4d208ae... When using -H with -M<size>, don't exceed the maximum heap size
     abb875d... some nats should be lnats
     a817962... Some further tweaks to reduce fragmentation when allocating the 
nursery
     41737f1... Deprecate lnat, and use StgWord instead
     06b4e78... Handle II16 size value in PowerPC code generator.
     0550bcb... comment updates
     bf2d58c... Lots of nat -> StgWord changes
     c3b6b3f... Update dependency on directory.
     7a01613... Fixing conflicts from merge with master
     56adc0b... reverting changes from first (bad) implementation
     220b069... Revert "Fixed bugs in overlapping type families caught by 
regression testing." Part of reverting old (bad) implementation of overlapping 
type families.
     1ccd6d0... Continuing to revert old bad implementation of overlapping type 
families
     a70242a... Reimplemented overlapping type family instances through a 
change in the CoAxiom type, instead of just a change in FamInst. The new 
CoAxiom supports multiple CoAxBranches. The use of a CoAxiom, say with the 
Coercion constructor AxiomInstCo, requires an index choosing which branch to 
use. The major changes are in types/FamInstEnv.hs, types/TyCon.hs, and to a 
lesser degree types/Coercion.lhs.
     74e43f4... Fixed iface-loading bug, with Simon PJ's help.
     728f4cf... Fixed bugs in overlapping type family instances.

_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to