- 07 Feb, 2005 3 commits
- 04 Feb, 2005 7 commits
-
-
simonpj authored
Wibble to message
-
simonpj authored
------------------------------------------------------ Report top-level implicit parameter errors more nicely ------------------------------------------------------ Consider module Main where main = let ?x = 5 in print foo foo = woggle 3 woggle :: (?x :: Int) => Int -> Int woggle y = ?x + y GHC's current rules say that 'foo' is monomorphic, so we get foo :: Int but we also get an unbound top-level constraint (?x::Int). GHC 6.2 emits a message like: Unbound implicit parameter (?x::Int) arising from use of `woggle' at ... The point is that THERE IS NO WAY FOR THIS CONSTRAINT TO GET BOUND, because we don't have a top-level binding form for implicit parameters. So it's stupid for 'foo' to be monomorphic. This commit improves matters by giving a much nicer error message: Implicit parameters escape from the monomorphic top-level binding(s) of `foo': ?x::Int arising from use of `woggle' at tcfail130.hs:10:6-11 Probably fix: add type signatures for the top-level binding(s) When generalising the type(s) for `foo'
-
simonpj authored
Respect --exclude-module in ghc -M; some tidying up as well
-
simonpj authored
Comments and type sig
-
simonmar authored
The HEAD is now 6.5
-
simonmar authored
In the fragments of Haskell code which setup buffering and flushing for the std Handles in GHCi, qualify names with System.IO rather than IO.
-
simonmar authored
Need to add -I. when compiling with GHC 6.3+
-
- 03 Feb, 2005 4 commits
- 02 Feb, 2005 12 commits
-
-
simonpj authored
Document dependency printing
-
simonpj authored
Dump package config only with -v4 Dump module dependencies (ghc -M) with -v2
-
simonpj authored
Tidy output
-
simonpj authored
Make sure that the argument of DataToTag is evaluated; rather a horrible piece of code, I fear
-
simonpj authored
Import trimming
-
simonmar authored
Add a helpful sanity check: if we try to re-enter the scheduler from Haskell code without going via suspendThread()/resumeThread(), such as when you have a 'foreign import unsafe' that should be 'safe', then you get an error message.
-
simonmar authored
include ghcplatform.h
-
simonmar authored
Fix sed command line
-
simonpj authored
Futher gruesome makefile hackery to deal with building lib/compat
-
simonpj authored
Fix two separate bugs in CoreLint, both relating to the fact that the substitution it carries must be applied exactly once. This cures a lint crash in Text.ParserCombinators.Parsec.Perm, which was triggered by -O2; specifically, SpecConstr generated some terms with heavy shadowing of type variables.
-
simonmar authored
Fix isLinkMode and adjust formatting a little
-
simonmar authored
Add an entry for "duplicate definition for __module_registered"
-
- 01 Feb, 2005 10 commits
-
-
simonpj authored
Finish docs for hs-boot files; please review!
-
simonpj authored
First cut at hs-boot documentation
-
simonmar authored
Generate some sensible code when presented with the output from gcc -O2
-
simonmar authored
whitespace
-
simonmar authored
hack upon the hack: confine the hack to -fasm, because gcc is too stupid to optimise away the extra temporary.
-
simonmar authored
small perf hack in emitVectoredReturnInstr: work around lack of CSE in the NCG by assigning info_amode to a new temporary.
-
simonmar authored
Add __attribute__((used)) to static functions, as gcc 3.4 -O2 is in the habit of throwing them away.
-
simonmar authored
Fix the source_unchanged test in the Hsc phase
-
simonpj authored
-------------------- Command-flag cleanup -------------------- * Fewer cases in GhcMode: eliminate DoMkDLL, DoLink, both in favour of StopBefore StopLn * Replace the NoLink boolean with a GhcLink three-way flag: NoLink, StaticLink, MakeDLL * Corresponding plumbing to link it all up.
-
ross authored
more regex test down to libraries/base
-
- 31 Jan, 2005 4 commits
-
-
simonpj authored
Tidy up stop-phase passing; fix bug in -o handling for ghc -E X.hs -o X.pp
-
simonpj authored
--------------------------- Some Template Haskell fixes --------------------------- * Tidy up conversion from TH.Name to RdrName.RdrName. It was partly duplicated between Convert.thRdrName and TcSplice.lookupThName. Now it's all in one place: Convert.thRdrName * Fix a bug in TH.tupleTypeName/TH.tupleDataName (GHC.Tuple -> Data.Tuple) * Export appEs from Language.Haskell.TH
-
simonpj authored
Compile utilities and lib/compat with GhcHcOpts, in case it is profiled
-
simonpj authored
Compile utilities and lib/compat with GhcHcOpts, in case it is profiled
-