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

Branch 'master' now includes:

     2c6d11f... Re-jig the reporting of names bound multiple times
     1a591a0... Refactor the way we infer types for functions in a mutually 
recursive group
     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
     bcef1e28.. 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
     7d847e8... Add "remote set-branches" support to sync-all
     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
     c32bb5d... Remember to zonk the skolems of an implication
     c3b6b3f... Update dependency on directory.
     0ee44de... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     c855396... Remove some CPP
     77b63e7... Two fixes to kind unification
     da5b7ba... Remove some more CPP
     26ebd1b... Pass Platform down to halfWordWidth
     94dbd65... Pass Platform down to halfWordMask
     00e4140... Whitespace only in cmm/CmmExpr.hs
     ad779f5... Whitespace only in cmm/CmmUtils.hs
     6986eb9... Whitespace only in codeGen/CgProf.hs
     f611396... Pass DynFlags down to bWord
     44b5f47... Pass DynFlags down to gcWord
     2b7319a... Pass DynFlags down to wordWidth
     86054b4... Use conditionals rather than CPP in mkDerivedConstants
     f89b73e... Add more modes to mkDerivedConstants
     72d3f4b... Make the Windows-specific part of mkDerivedConstants.c 
conditional
     6154cfa... We need to install the platformConstants file
     07c3777... Add a couple more mkDerivedConstants modes
     4279ab5... Use sIZEOF_* from platformConstants rather than Constants
     568fdb1... Use oFFSET_* from platformConstants rather than Constants
     a7a91cd... Remove the --gen-haskell mode of mkDerivedConstants
     6e1107b... Remove some unused HaskellConstants entries
     3f39164... Use intptr_t for offset values in mkDerivedConstants
     f4c327a... When allocating a new kind variable, do so with newMetaUnique
     f4d0e62... Fix build on OS X
     9b0c4ed... Start moving other constants from (Haskell)Constants to 
platformConstants
     291da8a... Check for Int constants that are too large in mkDerivedConstants
     c38794d... More OS X build fixes
     041e832... Move some more constants fo platformConstants
     6f3be2b... Merge branch 'master' of mac:ghc/git/val32/.
     f203e63... Move more constants into platformConstants
     b7dd4b5... MAX_REAL_LONG_REG is always defined, so no need to test it
     a22a9c2... Move more constants to platformConstants
     2115585... Whitespace only in nativeGen/RegAlloc/Linear/State.hs
     2e3c925... Put DynFlags into the RegM monad
     69e5f31... Remove a load of Platform arguments from RegM functions
     71f4b80... Remove more Platform arguments
     0692f7e... Whitespace only in nativeGen/RegAlloc/Linear/JoinToTargets.hs
     43e09ac... Remove more Platform arguments
     6dd23e6... Move some more constants into platformConstants
     c3f4c6f... Move wORD_SIZE_IN_BITS to DynFlags
     7d83fde... Bind "given" evidence to a variable, always
     cf02909... Merge remote branch 'origin/master'
     84bb854... Fix Trac #7237; mixup with empty tuples
     f33327a... Comments and laout only
     5bae803... Fix UNPACK with -fomit-interface-pragmas.
     7b8a17a... Print literal integers in External Core.
     7f5af24... Windows build fix
     a62b56e... Pass DynFlags down to llvmWord
     1791089... Move wORD_SIZE into platformConstants
     7ecefb6... Move more constants to platformConstants
     b0f4c44... Move tAG_BITS into platformConstants
     8c3b9ac... Merge branch 'master' of http://darcs.haskell.org/ghc
     79ee264... Pass DynFlags to the ru_try functions of built-in rules
     0678289... typo
     10cc422... Move tARGET_* out of HaskellConstants
     f21dabc... Remove the Target* types from HaskellConstants
     ba8fd08... Make the call to chooseBoxingStrategy lazy again
     998a633... Remove unused import
     e76fa69... Merge the remainder of HaskellConstants into Constants
     9224e48... Remove some CPP
     9615222... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     027a654... Small parallel GC improvement
     3f2eeee... Declare SRT labels correctly in the via-C backend
     16cc37f... make some debug output conditional on -ddump-cmmz
     98903b9... Give packHalfWordsCLit a more specific type
     b44db6f... Remove some uses of the WORDS_BIGENDIAN CPP symbol
     8244ec3... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     3a4c64c... Make StgHalfWord a portable type
     a9b986e... Make StgWord a portable type too
     0176c3f... Remove a little more CPP
     62bb618... Add some LDV_* constants to platformConstants
     f1e3729... Remove redundant #includes
     20670cc... Make the StgWord/StgHalfWord types more similar
     6a4d60a... Add the necessary REP_* constants to platformConstants
     fe58212... Make some uses of minBound/maxBound use the target Int/Word 
sizes
     54affce... Fix litFitsInChar
     aa6bc70... Remove a couple of unneccesary Platform arguments
     05a0a64... Change some "else return ()"s to use when/unless
     448ad24... We don't actually need a Show instance for the 
PlatformConstants type
     a6c06bd... Whitespace only in nativeGen/RegAlloc/Graph/Stats.hs
     616524d... Fix warnings in RegAlloc.Graph.Stats
     33a6df9... Make addSRM to strict additions
     85a8f79... Remove redundant pragmas from RegAlloc.Liveness
     987710c... non-tablesNextToCode fix for returns in the new codegen
     7bff9fa... refactor flattenCmmAGraph
     0b0a41f... Teach the linear register allocator how to allocate more stack 
if necessary
     096396d... fix warning
     c90d45f... fix warnings
     2e8f08c... splitAtProcPoints: jump to the right place when 
tablesNextToCode == False
     a910970... add a missing entryCode
     b92c76e... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     9e05651... Don't put unused constants in platformConstants
     a7147df... Add missing dataCast1 method to the Data Bag instance
     a17da16... FIX #7255: print tyConTyVars tc, not tc_args
     1f5d836... Allow allocNursery() to allocate single blocks (#7257)
     016fd74... Cache the result of countOccupied(gen->large_objects) as 
gen->n_large_words (#7257)
     c19f2e3... Include pinned memory in the stats for allocated memory
     5f01b6d... Fix off-by-one (#7227)
     ef3339c... Convert more RTS macros to functions
     c88fe39... Convert more RTS macros to functions
     ed6a7e4... Fix the profiling build
     118a09e... Remove a redundant cast
     6cf0e21... Whitespace only in rename/RnSource.lhs
     4bda967... Don't warn about defining deprecated class methods
     ca64cee... Use finiteBitSize rather than bitSize when it is available
     096c29d... Ignore deprecation warnings for bitSize in libs when validating
     673b6f5... Revert "Disable the timer signal while blocked in select() 
(#5991)"
     0b79d5c... Another overhaul of the recent_activity / idle GC handling 
(#5991)
     acdebbb... no functional changes
     b482966... Generate better code for "if (3 <= x) then ..."
     3596d5d... whitespace only
     254f1a6... whitespace and panic message fixup
     5cf7182... Misc tidyup
     93faddc... fix panic message typo
     3473e21... When -split-objs is on, make one SRT per split, not one per 
module
     16206a6... Remove some old-codegen cruft
     9c15249... fix stage2 compilation
     2145ffc... Build old-time with stage2
     d3128bf... Partially fix #367 by adding HpLim checks to entry with 
-fno-omit-yields.
     aa2d5b5... Remove an unused bit from the Lexer bitmap
     7724ecb... Remove a stray " in the build system
     6e6da3a... Tweak the build system handling of shell wrappers
     155e9e1... Document that we don't warn about defining deprecated class 
methods
     42cb30b... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc

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

Reply via email to