[commit: ghc] type-nats's head updated: Merge remote-tracking branch 'origin/master' into type-nats (7c4c48c)

Iavor Diatchki diatchki at galois.com
Mon May 20 20:43:58 CEST 2013


Repository : http://darcs.haskell.org/ghc.git/

Branch 'type-nats' now includes:

     d6ceeaa Change wording of "main is not defined in Main" message (Trac #7816)
     b5ac19a Fix the dynflags consistency code
     1aa7ae3 Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
     58e4f83 Improve the "main is not defined in Main" message a bit further
     29cc690 Make the desugarer a tiny bit cleverer on coercions (fixes Trac #7837)
     a56456d Comments and debug output only
     b088454 Remove accidentally-inserted tabs
     46e204f Allow partial applications of a type synonym in :kind in GHCi (Trac #7586)
     717d4a2 Merge branch 'master' of darcs.haskell.org:/home/darcs/ghc
     78f9189 Fix page numbering in the users guide PDF; fixes #7793
     87baa31 Check to see if TVar's are locked in check_read_only (fixes #7815)
     da65172 Comment only
     24ffa31 Merge branch 'master' of http://darcs.haskell.org/ghc
     5ba23df Remove boot-pkgs from SRC_DIST_GHC_FILES
     d6dd769 Update darcs -> git in a comment
     0ae042d Use a simpler way of finding the current git branch in sync-all
     55c7a0d Some sync-all refactoring
     561d64a Add a 'compare' command to sync-all
     432d104 Small build system refactoring
     54d7902 Small build system refactoring
     db14f97 Some build system refactoring
     9e4e2c2 Remove the Windows installer
     aa06f5d Follow build system changes in integer-gmp
     6579425 Add deriveConstants to the dep files we build in phase 0
     a8de924 Remove ghc-pkg from the list of dep files we build during phase 0
     7631562 Fix haddocking
     b45700c Tweak the bindist comparison tool
     c91c233 Fix typo (spotted by gabor)
     d65a61d Use different exeext variables for each stage; fixes #7709
     157ac08 Fix "make 2" in ghc/
     78d5644 Print details of panic messages raised from GHCi (#7844)
     144db21 Display operators using parentheses/backticks in error messages (#7848)
     310735e Use ffi_prep_closure_loc rather than ffi_prep_closure
     be66c4e Remove some cross-compilation kludges
     e781739 Use a pthread-based implementation of Itimer.c on iOS
     ca33aa8 pass the correct -Dxxx_HOST_ARCH and -Dxxx_HOST_OS to hsc2hs; Fixes #7761.
     2a17985 Update error message text; spotted bu Sergei Trofimovich
     a49fc52 Add stg_sel_n_noupd_info symbols to Linker.c
     72f8eab Add comments to describe AbsBinds
     ffe9a1e Tiny wibble to trace message
     c5f43e5 Comments only
     28c1461 When zonking, get rid of empty implications
     6ebab3d Never unify a SigTyVar with a non-tyvar type (fixes Trac #7786)
     2a7f4de Further wibbbling to type error message reporting
     5724ea0 More accurate cost attribution for stacks.  Fixes #7818.
     15da8ca Typos in comments
     2eea4ac Typo in debug print message
     392924c Comment typo
     ed9895d Comments and debug messages only
     a496e9a Make CmmParse abstract
     b49307f Don't duplicate decls unnecessarily in the environment
     dbd9645 Small refactoring in StgCmmExtCode
     be0b1df In CMM, only allow foreign calls to labels, not arbitrary expressions
     4ff7413 Allow deriving Generic for polykinded phantom types
     9e24b12 Update Makefile in docs/core-spec not to use latexmk
     b1c266c Updated documentation; changed "group" to "branched" in type families
     e83d0da Fixed moer tyops
     b3c0650 Fix the inplace name of ghc-cabal
     3e3707d Add a "Support dynamic-too" field to the --info output
     685f3b0 Whitespace only in StaticFlags
     0947a00 Update Cabal
     c9e7159 Remove some old commented-out code in StaticFlags
     c022831 Update the isStaticFlag predicate
     4d15f23 Mark -dynamic-too as unsupported for now
     ff2b7ad Update Cabal
     4b205b8 We need to setModLocation in the HscOut phase, not the Hsc phase
     25dd77f Fix "-dynamic-too --make"; fixes #7864
     4ae3def "ghc --info" now claims has "Support dynamic-too" as "YES"
     cee55b9 Remove DynFlags's hscOutName field
     da5c9c7 Whitespace only in MkExternalCore
     50ad870 Remove extCoreName from DynFlags
     ebc4305 Update Cabal
     9843083 When linking with $ORIGIN rpaths, use the "-z origin" linker flag too
     ce1094e Use -rpath flags on all Elf OSes, not just Linux
     c47c47a Handle sign bit when generating veneer for ARM Thumb branch relocation
     f6e0dbf Fix mismatched visibility of assembler impls of StgRun
     e5944d9 Don't use getPackageLinkOpts on iOS; fixes #7720.
     8ab3cc1 Set DYNAMIC_GHC_PROGRAMS=NO for FreeBSD because $ORIGIN is not resolved properly (see #7819)
     c797499 Fix linking with binutils 2.22 or later on FreeBSD 9.1, where one should explicitly link against any dependent library
     f6f1252 Fix build on Windows
     2cf5bd3 Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc
     a9608cb Record libffi directory in rts package conf; trac #7465
     49e6606 Make "ghc-pkg field pkg field --simple-output" do something useful
     4d8ad58 Remove some old "backwards compatibility" code
     0c3a967 Update Cabal
     7a310c7 Small refactoring in ghc-pkg
     4a55e81 Tidy up some build system code
     23f5080 Add -L flags to libs.depend (fixes #7465)
     50e78da Fix build
     8a1b7eb Fix build on OS X
     d3149f6 Tighten up on the kind checking for foralls
     b988dc3 Suppress a misleading error message (Trac #7869)
     6d8d0dd Exend the "Too few args" message for naked Ids (Trac #7851)
     d75ca39 Fix comment to placate Haddock
     ade1ae9 Enable -funbox-small-strict-fields by default
     11a85cc extended ticky to also track "let"s that are not conventional closures
     9e390fd Don't suppress foralls in the RHS of a type synonym definition!
     3722f03 Improve documentation of kind polymorphism
     f3472f5 Make isPredTy not use typeKind
     db07129 Eliminate (given) flatten-skolems in favour of user type variables
     7a7530a Fix kind quantification (again)
     d31dd88 In doTopReactDict, try lookup even if fundeps work
     bee30a6 Improve error message for existential newtypes
     ed54858 Do not duplicate work in SpecConstr (fix Trac #7865)
     71aaa3f Fix/update SayAnnNames plugin example code.
     c041b62 Reorganize mk/build.mk.sample a little.
     92191a3 Allow deriving Typeable for more tycons
     ad1bc9d Update the name cache when creating new names via DeriveGeneric
     4be70f9 Treat foreign imported things in CMM as being in this package
     a5a52d7 Fix dynamically linked GHC on Windows
     ba00c33 Fix the name of libffi
     dca18dc Generate dependencies for .cmm files properly
     674cf90 rts_checkSchedStatus: exit the thread, not the process, when Interrupted
     0499eac Make -fno-flat-cache use a dynamic, rather than static, flag
     8241cdd Remove a redundant wrapper function
     3d51be4 Make sure the RTS is built, even when no programs are being built with stage1
     eb569b6 Fix an all-target call in the build system
     315b36b Some build system tweaks
     40cdee7 Modernise code in rename/RnEnv.lhs
     fe427ea Remove an old commented out import
     3a1ecd9 Whitespace only in typecheck/TcHsSyn.lhs
     ee4a534 Remove a "mappM = mapM" wrapper in typecheck/TcHsSyn.lhs
     4e84e51 Remove a "returnM = return" wrapper in typecheck/TcHsSyn.lhs
     a2be710 Modernise some code
     b2cae55 We actually need to use -threaded/-debug when linking /all/ DLLs
     b935841 Remove obsolete documentation.
     b35a6ce More work towards dynamic programs on Windows
     0aae298 Merge win:/cygdrive/c/ghc/git/dt
     9d18aea Merge branch 'master' of http://darcs.haskell.org/ghc
     089cb62 Kill dead code.
     1cc96d5 Remove redundant cmmMakeDynamicReference' wrapper
     7e723a1 Refactor cmmMakeDynamicReference
     58dcced Use NatM_State record fields, rather than matching/constructing the whole type
     b8447a9 Make the current module available to labelDynamic
     ff1a16a Simplify ghc-cabal
     60b86b0 Fix the GHC package DLL-splitting
     bb2795d Merge branch 'master' of http://darcs.haskell.org/ghc
     69a343a Fix ghci on Windows when GHC is dynamically linked
     2c9cb4d Stop excluding the dyn way for the dph packages on Windows
     192c7b7 Define the right RTS config in the Windows dyn wrapper programs
     41e5229 Link to the right RTS whenever we build a .dll on Windows
     8a58851 SpecConstr: seed specialisation of top-level bindings, as with letrecs.
     a91e230 Comments only
     a18ea4f Make 'undefined' have the magical type 'forall (a:OpenKind).a'
     fe389f5 Make splitHsAppTys look through parentheses, fixing Trac #7903
     1d4704d Improve pretty-printing of inline-family pragmas; fixes Trac #7906
     0452021 Fix typechecking of pattern bindings that have type signatures (Trac #7268)
     ca2d30c Comments only
     672553e Make reifyInstances expand type synonyms robustly (Trac #7910)
     efc515a Don't try to build bindist wrappers on Windows
     d533da9 Merge branch 'master' of http://darcs.haskell.org/ghc
     9fc2778 Documentation: use new syntax for record GADTs (#7915)
     c6a05a7 Make dynamic GHC no Windows installable too
     8ed0bda Don't link base/rts/... into C wrapper programs
     a08759d Move the genSym stuff from rts into compiler
     b519e00 Don't try to make windows-installer
     a44978b Update a comment; spotted by Carter Schonwald
     891857a Fix parsing export lists
     a4cc7b1 Remove unused __2Int_encodeDouble
     e20dfbc Expose __word_encode{Float,Double}; fixes integer-simple build
     f7e33ca Add some extra debugging info
     fdd552e Fix a build problem with integer-simple
     bf6854b Fix build problem: Error: junk `.get_pc_thunk.bx' after expression; trac #7799
     6acfc45 We can't use Integer literals when compiling the integer-* package, either
     83a9f4f Refer to the wiki page in the "Make has restarted itself n times" error
     1227600 Need to work around #7799 on all i386 platforms, not just Darwin
     5734f7a Fix -dynamic-too on Windows
     7c4c48c Merge remote-tracking branch 'origin/master' into type-nats



More information about the ghc-commits mailing list