Repository : ssh://darcs.haskell.org//srv/darcs/ghc
Branch 'overlapping-tyfams' now includes:
7babb1b... Big changes on tc-untouchables branch
5b4fef6... When floating constraints outwards, promote the floated type
variables
0d55e1e... Avoid emitting Given constraints for spontaneous unifications.
Instead keep spontaneous unifications /only/ in the TcS tybinds. Relevant note
is Note [Spontaneously solved in TyBinds] in TcInteract.
ee578b6... Merge branch 'tc-untouchables' of http://darcs.haskell.org/ghc
into tc-untouchables
34be452... Minor fixes, mostly simplificaitons
f5216cd... Merge remote-tracking branch 'origin/HEAD' into tc-untouchables
2b69233... A raft more changes, * simplifying and tidying up
canonicalisation, * removing the flat cache altogether * making the FunEq
worklist into a deque
b737a45... More simplifications to the constraint solver
4026038... Nicer pretty printing for tuple kinds
fe6ddf0... A bunch more simplification and refactoring to the constraint
solver
740cbdf... Merge branch 'tc-untouchables', remote branch 'origin' into
tc-untouchables
ff32f97... Wibbles to fe6ddf00, fixing infelicities
d37deb7... Some comments and false starts to do with ArrForm
82ace67... Comments only
d4fa711... Remove historical Unique parameter from pushUntouchables
ed7538b... Move inert_insols into the InertCans record
64d07ab... Make kickOutRewritable kick out insolubles
b493d39... When defaulting, check for *meta* tyvars
7560dd6... Some refactoring; removes simplifyCheck
7d847e8... Add "remote set-branches" support to sync-all
633dd55... Moved solving of type families to zonkWC and a few
simplifications in TcSimplify. Now unflattening does not happen recursively
inside solveWanteds which should be a good performance win.
c32bb5d... Remember to zonk the skolems of an implication
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
ad0139a... Merge branch 'master' of http://darcs.haskell.org/ghc
b0db930... Merge remote-tracking branch 'origin/master' into
tc-untouchables
8a9a7a8... Add type "holes", enabled by -XTypeHoles, Trac #5910
5f312c8... Spelling in comments only
8089391... Comments about how the untouchables stuff works
0683258... Improve the binding location of class methods (I think)
d30b9cf... Another refactoring of constraints
1a6ab64... Remove cc_ty from CIrredCan and cc_hole_ty from CHoleCan
bd6b183... Tidy up and simplify TcMType.zonkFlats (discussion between DV
and SLPJ)
510f439... Tidy up and simplify simplifyRule, pls adding some other
comments
af7cc99... Implement 'left' and 'right' coercions
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
58470fb... Make a start towards eta-rules and injective families
1b5c833... Undo making Any into a type family, for now
19dd108... Be careful about kinds when eta-expanding AppCo
09a0670... Signatures and comments
9429190... Make sure that even insoluble constraints are fully substituted
8e7d415... Merge remote-tracking branch 'origin/master' into
tc-untouchables
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
08167ac... Merge remote-tracking branch 'origin/master' into
tc-untouchables
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
23db38b... Comments only
b00c29d... Fix an outright bug in my "left/right" stuff, and refactor
canEqLeafTyVarEq along the same lines as our earlier refactoring of
canEqLeafFunEq
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)
3f2bd36... Fiddling with kind errors
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
4e339e0... Improve pretty printing for coercions
f18c188... Wibble to debug print
39f0bd0... Comments only
e7279ac... Fix kind unification in the special rule for ($)
444577a... Comments only
6a9542a... Better ASSERT message
9a058b1... Refactor the handling of kind errors
6e3e64a... Merge remote-tracking branch 'origin/master' into
tc-untouchables
7fdc2a3... Add missing case in TcUnify.matchExpectedFunKind
f6983ef... Change how we handle options required by 'way's
c35c5d0... Improve pretty printing for coercions (exp transistivity chains)
bd2aef6... Comment out a particularly verbose trace
2b523dc... Use System Names for evidence variables
adb6bcb... Fix an ASSERT
7fdcf2c... Simplify the reOrient function (no change in behaviour)
453e0ce... Modest refactoring in TcCanonical (and TcSMonad)
b3f2f73... Modest refactoring (put bumpStepCounter into traceFireTcS, and
other simple things)
935fa10... Comments about silent superclasses
316d3ed... Tracing in TcUnify
fd3bd41... Merge branch 'tc-untouchables' of http://darcs.haskell.org/ghc
into tc-untouchables
29ee75a... Remove some old, commented out bits
cddbf86... Allow -static to be used after -dynamic
29f6b87... Do flag consistency checks at the end of flag parsing
d106284... Put libexec binaries in lib/bin/ rather than just lib/
483c763... Refactor the shell-wrapper-creation logic
522a155... Comments, and unused import
902a863... Improve (and simplify) the short-circuiting of Refl coercions
fc8f9c1... Fix typo in the documentation of CApiFFI
2d96202... -fhpc is no longer a static flag (fixes hpc tests)
815dcff... A few more constraint solver improvements
74d6511... Merge remote-tracking branch 'origin/master'
4708d38... Merge branch 'tc-untouchables'
2c207b6... Compare the kinds of type variables when comparing types
a501c95... Make sure that we check for type errors strictly in a Template
Haskell splice, even if -fdefer-type-errors is on
419af69... Give PrimOps a NOINLINE pragma, to suppress silly warnings from
dsRule
58eaacc... Add a flag to tell ghc to use $ORIGIN when linking program
dynamically
0b06d68... Improve constraint solver depth error slightly
baab120... Fix type error in 2c207b6f (Compare the kinds of type variables)
3b980d0... Typo
ba56d20... This big patch re-factors the way in which arrow-syntax is
handled
65e6470... Merge branch 'master' of http://darcs.haskell.org/ghc
898cb09... Build the dynamic way by default on Linux/amd64
7c0b518... The non-dynamic ways now need to explicitly use -static
1b3f274... Add a couple more RTS ways
a6b0ab2... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
30b0871... Add a "Dynamic by default" field to the ghc --info output
d1c8731... Fix the recompilation check for dynamic libraries
6aed04f... Fix Windows build
911bc5c... Windows install fix
16a8414... Actually build things the dynamic way
56a8c8a... Comments only
eb6c3ee... Improve pretty-printing for holes
00cb878... Improve debug tracing slighty
b442ad9... Do not create extra evidence given/derived variables in the
Refl case of rewriteCtFlavor
629d1f4... Improve erorr location for Given errors
b9fccbc... Do not do type-class defaulting if there are insoluble
constraints
ed5ebee... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
b49ad6b... Load the right object files in ghci
6784ddd... Make adjust_ul handle BCOs
4a138b7... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
aed37ac... Add a ToDo comment
a7c0387... Produce new-style Cmm from the Cmm parser
620d885... expand tabs
6e95114... fix a warning
e1846d7... Fix a dependency bug in the build system
a94144b... untab
f7cd14f... Put the DynFlags in a global variable for tracing; fixes #7304
1406483... Fix copyArray# bug in old code generator
5cff4fb... Fix copyArray# bug in new code generator
2a53408... Merge ../ghc
c3939fd... Make the -ferror-spans flag dynamic
9c6223d... Remove unnecessary warning suppression
70765e8... Fix comment
cc2a4d5... profiling fixes
0a768bc... Make the opt_UF_* static flags dynamic
879aae1... -fliberate-case-threshold is already a dynamic flag
ef786b6... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
f89ce06... Make the -dsuppress-* flags dynamic
1255ff1... Make -fmax-worker-args a dynamic flag
30e7b73... Make -fsimple-list-literals a dynamic flag
577f50f... Whitespace only in simplCore/SimplEnv.lhs
d131d66... Whitespace only in simplCore/SimplUtils.lhs
a327c14... Whitespace only in simplCore/SimplMonad.lhs
e731cb1... Make -f(no-)pre-inlining a dynamic flag
70c6416... Make -fexcess-precision a fully-dynamic flag
80fcdd6... Put the generated Parser.y under compiler/stage<n>/build; fixes
#7195
5041a26... Move the primop bits into the compiler/stage<n>/build
directories
87e8c55... Remove distrib/Mac*; fixes #7136
e84dc37... Remove the distrib/prep-bin-* scripts
2f40085... Remove cvs-build; it's no longer used
fe0efaa... Remove fake-happy; it's no longer useful
b921de7... Fix build on Windows
bc6a2cc... Whitespace only in typecheck/TcGenDeriv.lhs
a49580f... Whitespace only in typecheck/TcDeriv.lhs
74ae9bb... Add an "Outputable (InstInfo a)" instance
e9b1256... Whitespace only in types/FamInstEnv.lhs
55478b1... ghc-pkg: Print something when no packages are found; fixes #6119
9991890... Ensure we produce a FunTy for functions (Trac #7312)
beb2f74... Be lazier when typechecking data type contexts (Trac #7321)
b285ae1... Fix error in tidying the type variables of a TyCon when
building an interface file
b7fbf3a... fix obvious typos
25dc200... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
5c43947... Don't build the HS*.o files when DYNAMIC_BY_DEFAULT
4780cbc... Add a type signature needed when using GADTs
83f5c6c... When dynamic-by-default, don't use the GHCi linker
56a2003... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
76410f7... Fix typo
be497c2... Keep the list of DLLs that we dlopen
22df953... Fix test for GHCi lib building
5f3c105... rts: Ignore signal before deleting timer. Fixes #7303.
3c45e5a... Fix installing when dynlibs-by-default
817e1d5... Add TRANSITIVE_DEPS variables to package-data.mk files
a7c70e9... Move the RPATH computation into the build rules
b3dacbd... Don't set dynlib install names when building
8c24ab9... Double a couple of $s for consistency
0271742... Get dynamic-by-default mostly working on OS X
bbd9139... Use Cabal to build hpc-bin
70a76bf... Use Cabal to build ghctags
7da6555... Fix copy/paste-o
0af4562... Fix some dependencies
8f4cb4d... Default to dynamic-by-default on OSX/64
8af2d94... Merge branch 'master' of http://darcs.haskell.org/ghc
c8bac7c... Elaborate the typechecker's trace slightly
7435825... Add kind-defaulting in simplifyInfer (fixes Trac #7332)
9ab868e... Comments only
81594da... Use isCheapApp in exprIsWorkFree
a609027... Add a new traceMarker# primop for use in profiling output
0b2a6a0... Wrap a bracket quotation in a coercion that makes it have the
right type
6976210... Refactor the type of tcBracked (no change in behaviour)
92916e0... Move occurCheckExpand from TcCanonical to TcType
8691041... Improve error reporting for kind occurs-checks
9f3b927... Use -O0 -g C flags when compiling a debug way
ad94e00... Make -ddump-cmmz-cfg turn on the right flag
bb8cb0e... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
81f43eb... Remove unused dumpIfSet_dyn_or
5cd52bf... Build system fix for building a profiling GHC
86f6acd... Rename DynFlag to GeneralFlag
d5ab88c... Rename setDynFlag, unSetDynFlag following the
DynFlag->GeneralFlag rename
4d4797d... Whitespace only in simplStg/SimplStg.lhs
6759e5a... Remove a copy of foldM, and use the standard function instead
cd33eef... Some alpha renaming
f934258... Fix build on OS X (fix from Duncan Coutts)
6e771fa... Remove unused -ddump flags
51da4ee... Put header and timestamp in dump files
d4a1964... Refactor the way dump flags are handled
21e5b61... Turn DYNAMIC_BY_DEFAULT off in mk/build.mk.sample
660dc69... Follow 'flags' -> 'generalFlags' rename
5e54d55... Fix conversion of HsRule to TH syntax
984676d... Deprecate Rank2Types and PolymorphicComponents, in favour of
RankNTypes
b597182... Fix a long-standing bug in tidying
a351361... Comments and debug tracing only
e252bb6... Improve error reporting for kind errors
0001f51... Whitespace only in nativeGen/PIC.hs
6a58aa0... In approximateWC, do not float contraints out of an implication
with equalities
242fc56... Some refactoring of the occurs check in TcUnify
5381000... profiling fixes
2726033... Improve reporting of duplicate signatures
6fbd46b... Remove the old codegen
8019bc2... Only promote *non-existential* data constructors
c6f4f8a... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
6c54727... Set the way when loading dynamic objects for GHCi
d277031... Suppress deprecation warnings for Rank2Types in libraries that
use the flag
827598e... Wibbles in TcErrors
1152f94... An accidentally-omitted part of commit 8019bc2c, about
promoting data constructors
4a738e1... Simplify and clean up kind-checking of type/class declarations
8e189a7... Simplify code slightly; no change in behaviour
429c81c... Merge branch 'master' of http://darcs.haskell.org/ghc
bca2e47... Whitespace only in simplCore/OccurAnal.lhs
176a360... Fix typo
e3d7889... Add some more primop rules; fixes #7286
fc5a6e2... Whitespace only in hsSyn/HsExpr.lhs
2cf9093... Add some more PrimOp rules
b093521... Add a rule for (plusAddr# x 0) == x; fixes #7284
9f9bb2b... Add the p_dyn and thr_p_dyn ways
4f83f54... Set V = 1 by default, and add info about turning it off to
build.mk.sample
771d376... add GHC.Float.rationalToFloat, rationalToDouble (fixes #7295)
6bb741b... Use fromRational when pre-computing fromRational literals
82879d9... Be careful when combining two CFunEqCans, in the case where one
has a unification variable on the right.
cd51b9c... In lookupFlatEqn, look in the flat-cache *last*
b243d30... Merge branch 'master' of http://darcs.haskell.org/ghc
49108c3... typo
412af8c... Foreign calls can clobber heap & stack memory too
14ddde0... When DYNAMIC_BY_DEFAULT, make inplace wrappers for everything
5f37e0c... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
82ab12a... October 2012 stats
2c2be63... comments only
c7942f9... Fix a silly bug that would cause -xc to print less than useful
information
d81d70b... fix a warning
2471a6b... Use canned heap checks to save a few bytes of code
dc7a936... Avoid calling toInfoLbl on the entry label (#7313)
bba7621... Fix -fPIC on OS X x86
a5bf0d5... Merge branch 'master' of http://darcs.haskell.org/ghc
2324b40... removeWay should also unset the wayGeneralFlags
a7e0d44... a small -fPIC optimisation
88a6f86... Small optimisation: always sink/inline reg1 = reg2 assignments
a58b2d0... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
a299f10... Use Cabal to build mkUserGuidePart
fb41ac5... extend LD_LIBRARY_PATH instead of replacing it
09209de... Add a case for CmmLabelDiffOff to cmmOffsetLit
65fec07... Comment to explain why we need to split proc points on
x86/Darwin with -fPIC
61bf570... fix bug in heap check in putMVar#
0b3811c... typo
935bf7c... Merge branch 'master' of http://darcs.haskell.org/ghc
b8da5dd... Remove the kludgy TH dependencies
68ae113... Make it possible to build with only way dyn
b01edb0... Merge branch 'master' of http://darcs.haskell.org/ghc
c67b431... Always use --force when registering packages
df2bcd8... Set the default way correctly when dynamic-by-default
820134a... remove unused sched_shutting_down
afbceef... delete old comments
24b4bfb... Fix bug in 88a6f863d9f127fc1b03a1e2f068fd20ecbe096c (#7366)
9008ae0... declare stg_gc_prim and stg_killMyself (#7350)
cdf1389... fix off-by-one-column in showRichTokenStream (#7351)
467e1a6... fprintCCS_stderr: untag the exception (#7319)
b54318d... Remove an outdated comment
38aeca2... Make "ghc-pkg check" check for prof and dyn ways, as well as
vanilla
86e2479... Fix the transformers-building code, and move it from validate
to ghc.mk
6e28baa... Make DefaultFastGhcLibWays be just "dyn" when we are dynamic by
default
9a2f777... Merge branch 'master' of http://darcs.haskell.org/ghc
c588395... Fix a bug in CmmSink exposed by a recent optimisation (#7366)
c03a899... Fix installation of vanilla libraries
8d8af5e... Revert "Always use --force when registering packages"
f3115bd... Fix the haddocking build system rules when dynamic is the
default way
93d4539... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
e0c77c9... Fix doc typo; fixes #7318
615268a... Tweak build.mk.sample
edb5303... Fix installation
9246f7c... Improve trace
b6acaf0... Comments in Note [Efficient orientation] about interacting
CFunEqCans
66ec09b... Merge branch 'master' of http://darcs.haskell.org/ghc
3406c06... More info on a Core Lint failure
ec0d62c... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
788cead... Revert "Suppress deprecation warnings for Rank2Types in
libraries that use the flag"
26b2caf... Make Rank2Types and PolymorphicComponents into a synonym for
RankNTypes (no deprecation)
84d527b... Improve the GhcLibWays sanity checking
0c7f0c2... Add some missing parentheses to mkDerivedConstants.c
fb1b2c7... Fix a couple of format strings
3a0a315... Fix build on platforms on which we don't have register info
1b02de8... Remove some old .gitignore entries
d24ffd6... Remove some more unused .gitignore entries
0c4ed55... Move ghc-pkg's generated Version.hs inside the dist directories
5558bea... Rearrange .gitignore a little
795a3fd... More .gitignore updates
5956473... Fix a makefile rule
f8c23ff... Fix bug with reporting deprecated use of flag (Trac #7349)
910a642... Do not treat a constructor in a *pattern* as a *use* of that
constructor
11aa737... Fix dependency generation when GhcLibWays = dyn p
4444dd8... INFO_TABLE_RET should generate a CmmRetInfoLabel, not a
CmmInfoLabel
092c0bd... Make DYNAMIC_BY_DEFAULT=NO when GhcUnregisterised
8e81684... Cmm jumps always have live register information.
f9265dd... Attach proper jump liveness information to generated C-- code.
3db0254... Save and restore registers across calls to unlockClosure.
6a68507... Generalize register sets and liveness calculations.
82ede42... Properly mark C-- calls to _assertFail as "never returns".
5ee08dd... Attach global register liveness info to Cmm procedures.
e2f6bbd... Draw STG F and D registers from the same pool of available SSE
registers on x86-64.
dcf88e6... Generate correct LLVM for the new register allocation scheme.
a50cd57... Get ride of the -fregs-liveness flag.
8c7dc71... Change how touchy sets the file time
8d226e2... Improve touchy
8623be0... Merge branch 'master' of http://darcs.haskell.org/ghc
a44a5e3... Clean some old files that we no longer generate
4baebfa... Comments only
10f8342... Do not instantiate unification variables with polytypes
7e255c5... Merge branch 'master' of http://darcs.haskell.org/ghc
ab5008d... Retainer prof: immutable arrays are not retainers, and fix the
docs
984149b... Fix C macro bug that was causing some stack checks to
erroneously succeed
2677e42... Wibble to recent changes to TcErrors
33d0f49... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
232f1a2... Add notes about type-family overlap in GHCi (see Trac #7102)
d7ca7af... Whitespace only in nativeGen/NCGMonad.hs
2073e3e... Don't clearNurseries() in parallel with -debug
d28a722... A couple of W_s should be P_s (not an actual bug, I think)
26e576c... Fix bug in stg_ctoi_R1n (could cause GHCi crashes)
ee43ad5... turn off cmm optimisation for the debug way
3a6b1bf... Turn on -O2 for the RTS by default
458ee4f... Add -fghci-hist-size=N to set the number of previous steps
stored by :trace
8703bbc... The shape of StgTVar should not depend on THREADED_RTS
225172e... Fix bug in stg_enter_checkbh
dba4fa5... Fix typos
7706bee... Whitespace only in codeGen/StgCmmPrim.hs
2293238... Fix popcnt calls
d163845... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
095b9bf... Don't put uniqs in ghc wrapper function names; part of #4012
7c4157a... Whitespace only in basicTypes/Name.lhs
f416129... Don't use a unique in the stable name of a foreign export
0a7c4ef... Whitespace only in typecheck/TcRnTypes.lhs
fb31191... Refactoring: Make a HasModule class for getModule
d868491... Remove unused function fmapM_maybe
af072fc... Change how dependency generation works; fixes #7381
f2b953f... Remove an -fno-cse flag
bc4580c... Whitespace only in specialise/SpecConstr.lhs
ede3bd9... Whitespace only in basicTypes/Id.lhs
ba38f99... Avoid putting uniqs in specconstr rules; part of #4012
680dca1... typo
8b25d39... Save R1/R2/.. across foreign calls
811a19c... fix 'return' in cmm code when tablesNextToCode==False
a307ad5... small optimisation: inline stmNewTVar()
9f68cce... loadThreadState should set HpAlloc=0
699f8e1... Remove getModuleDs; we now just use getModule
6ca4616... Comments only
acbe526... Fix the instantiation of data constructors in the GHCi debugger
4dade85... Make rewriteCtFlavor lazy in the coercion for Derived evidence
545bb79... Refine the "kick-out" predicate for CTyVarEq
2e43779... Merge branch 'master' of http://darcs.haskell.org/ghc
3ca7260... typos
50728d0... another typo
3862220... fix typo, courtesy of Jon Cave, thanks!
f5e5316... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
1a0af0e... Add a comment about why we use nextWrapperNum rather than a
unique
7dd7008... Give dynamic libraries, as well as programs, RPATHs
71f7ab6... define own version of PRIdPTR on platform where its not
available
c2b5698... Give an error if we can't find a suitable value for PRIdPTR
b78b6b3... add note about compilation safety to safe haskell docs
df04d2d... Allow '-' to be used as an infix type constructor.
121768d... Merge branch 'master' of ssh://darcs.haskell.org/srv/darcs/ghc
d92bd17... Remove OldCmm, convert backends to consume new Cmm
9295780... Fix warnings
4dc7d04... replaceLabels: null out the cml_cont field of CmmCall
a1ebe37... handle MO_Touch, and generate no code for it.
e15981a... some W_s should be P_s
afd7e22... assert HpAlloc == 0
65e46f1... a fix for checkTSO(): the TSO could be a WHITEHOLE
2ef95e8... remove some unused variables
1c160e5... ASSERT(HpAlloc==0) in the update code, to catch HpAlloc bugs
f49271c... Replace mkDerivedConstants.c with DeriveConstants.hs
0564a63... Add some more flags to includes_CC_OPTS
37710de... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
30b7eba... Fix build on Windows
4270d7e... Fix the Slow calling convention (#7192)
e86dee3... Fix installing on Windows
4aa921e... Don't include a (void *) cast in BLOCK_ROUND_UP
53e9916... Fix the OFFSET macro
958faee... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
9756690... Tell the compiler about alpha, mipseb and mipsel again; fixes
#7339
a9ec8ec... Remove the inline primop
9d7182f... Remove the nonexistent lazy primop, and follow move from
GHC.Base to GHC.Magic
7ea4966... Update the "Special built-in functions" docs
e407935... Remove the HAVE_SETITIMER_VIRTUAL configure test
244882d... Remove unused FPTOOLS_GREENCARD configure macro
f871ac9... Remove unused FP_EVAL_STDERR configure macro
ea301fa... Remove unused FP_GEN_FO and FP_PROG_FOP configure macros
e605c3e... Simplify BOOTSTRAPPING_GHC_INFO_FIELD
70a0dd6... Remove unused FP_PROG_SORT / SortCmd / SORT
da3b7cc... Remove unused FPTOOLS_SHEBANG_PERL
c0017bd... Fix FP_CHECK_TIMER_CREATE when cross-compiling
7b41a69... Remove redundant configure check for timer_create
f0f63a5... De-tabify register allocator code
b13ebb6... Comments and formatting to register allocators
cace1ca... Comments and formatting to spill cleaner
a157ea7... Comments and formatting to spill cost code
0b436ae... Comments and formatting to register allocator stats
fb50847... Haddoc fix
3f99654... Improve documentation about instance resolution following
suggestions from Mike Sperber
234fd08... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
6e4f6c6... typos in comments
97dc57c... fix bug in previous commit,
65e46f144f3d8b18de7264b0b099086153c68d6c
6d784c4... Add a write barrier for TVAR closures
1437590... Document -XTypeHoles
4ee5e3b... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
80269ef... fix syntax error in generated C (#7407)
a70e45f... C backend: ignore MO_Touch
dfb8d40... We now assume that offsetof() is always defined
cf939b3... Add a stddef.h #include to C file generated by DeriveConstants
5874a66... Remove some dependencies
7da1376... Code-size optimisation for top-level indirections (#7308)
31c0717... C backend: put the entry block first
6486213... Reject promoted constructors when -XDataKinds is not enabled
(FIX #7433)
839621c... Merge branch 'master' into overlapping-tyfams
704f802... fix some typos
c22850f... Enable dynamic-by-default for unregisterised arches
91c6593... Enable GhcWithInterpreter when DYNAMIC_BY_DEFAULT is on
951e28c... Unconditionally disable DYNAMIC_BY_DEFAULT for now
d94250e... add embedded vendor
64efee6... Add fixity information to primops (ticket #6026)
359efbf... typo
eb5196c... Move seq's fixity declaration info primops.txt.pp
9ef4d48... Fix building on Sparc/Solaris with non-GNU linker; fixes #5407
b350ac5... Use the right environment for tidying the types of a data
constructor
e1dbabb... Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
b610a84... "hpc version" now shows the version number from the .cabal file
c04a984... Separate warning flags from other flags in validate-settings.mk
95027b8... de-tab hpc
39f2737... Add a --reset-hpcdirs flag to hpc
464646d... Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
6eb0341... Revert "Move seq's fixity declaration info primops.txt.pp"
948f101... Normalise command names differently in sync-all
f73d60b... Use submodules for repositories with upstreams
c2430f0... Make Constraint and * look identical in Core (System FC)
c8f4f50... Accurately report usage of newtype data constructors in FFI
declarations
1135c84... Improve kind inference for tuple types
661c1c1... Improve error message when a variable is used both as kind and
type variable
6960556... Merge branch 'master' of http://darcs.haskell.org/ghc
3a82618... typos in note
086d7c5... Fix #7231: don't unload stable modules when there is an error
later
644475c... Continued polishing of overlapping type family instances.
021ca7b... Removed tabs from RnSource and FamInstEnv
82e928a... Merge branch 'master' into overlapping-tyfams
_______________________________________________
Cvs-ghc mailing list
[email protected]
http://www.haskell.org/mailman/listinfo/cvs-ghc