Re: [commit: ghc] master: Add :info! to GHCi. This shows all instances without filtering first. (2ec32a8)

2012-11-30 Thread Simon Marlow

On 30/11/12 02:03, Iavor Diatchki wrote:

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

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/2ec32a8e1cb323b230b0c228dbee313647892bf4


---


commit 2ec32a8e1cb323b230b0c228dbee313647892bf4
Author: Iavor S. Diatchki diatc...@galois.com
Date:   Thu Nov 29 17:14:48 2012 -0800

 Add :info! to GHCi.  This shows all instances without filtering first.

 The default behavior of :info is to show only those instances of
 for a type, where all relevant type constructor names are in scope.
 This keeps down the number of instances shown to the user.

 In some cases, it is nice to be able to see all instances for a type.
 This patch implements this with the :info! command.


Was there some discussion about this?  The last I remember was this:

http://hackage.haskell.org/trac/ghc/ticket/5998

where we decided not to implement this because it is essentially a 
random UI: the behaviour can't be described sensibly because it depends 
on which interface files GHC happens to have seen so far.


There's also this:

http://hackage.haskell.org/trac/ghc/ticket/3080

which looks like a duplicate (I just closed it).

Cheers,
Simon



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


[commit: ghc] master: Extend parser to allow specification of RULES that never fire. #7162 (779f10f)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/779f10fdedbeeb31891f3f3772cbc2dfdd32e1ee

---

commit 779f10fdedbeeb31891f3f3772cbc2dfdd32e1ee
Author: Andrew Farmer afar...@ittc.ku.edu
Date:   Thu Oct 4 16:51:28 2012 -0500

Extend parser to allow specification of RULES that never fire. #7162

---

 compiler/parser/Parser.y.pp |1 +
 1 files changed, 1 insertions(+), 0 deletions(-)

diff --git a/compiler/parser/Parser.y.pp b/compiler/parser/Parser.y.pp
index 3029930..a7a327a 100644
--- a/compiler/parser/Parser.y.pp
+++ b/compiler/parser/Parser.y.pp
@@ -882,6 +882,7 @@ activation :: { Maybe Activation }
 explicit_activation :: { Activation }  -- In brackets
 : '[' INTEGER ']'   { ActiveAfter  (fromInteger 
(getINTEGER $2)) }
 | '[' '~' INTEGER ']'   { ActiveBefore (fromInteger 
(getINTEGER $3)) }
+   | '[' '~' ']'   { NeverActive }
 
 rule_forall :: { [RuleBndr RdrName] }
 : 'forall' rule_var_list '.'{ $2 }



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


[commit: ghc] master: Make ghc-pkg print less on error. (2c6939a)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/2c6939a5b0b11950712be160d2712aee0e6f8b4b

---

commit 2c6939a5b0b11950712be160d2712aee0e6f8b4b
Author: Ben Millwood thebenmachine+...@gmail.com
Date:   Fri Sep 7 17:22:46 2012 +0100

Make ghc-pkg print less on error.

---

 utils/ghc-pkg/Main.hs |   11 ++-
 1 files changed, 6 insertions(+), 5 deletions(-)

diff --git a/utils/ghc-pkg/Main.hs b/utils/ghc-pkg/Main.hs
index e727f4d..6e9dba6 100644
--- a/utils/ghc-pkg/Main.hs
+++ b/utils/ghc-pkg/Main.hs
@@ -98,7 +98,7 @@ main = do
Left err - die err
 (_,_,errors) - do
prog - getProgramName
-   die (concat errors ++ usageInfo (usageHeader prog) flags)
+   die (concat errors ++ shortUsage prog)
 
 -- 
-
 -- Command-line syntax
@@ -185,6 +185,9 @@ deprecFlags = [
 ourCopyright :: String
 ourCopyright = GHC package manager version  ++ Version.version ++ \n
 
+shortUsage :: String - String
+shortUsage prog = For usage information see ' ++ prog ++  --help'.
+
 usageHeader :: String - String
 usageHeader prog = substProg prog $
   Usage:\n ++
@@ -408,11 +411,9 @@ runit verbosity cli nonopts = do
 recache verbosity cli
 
 [] - do
-die (missing command\n ++
-usageInfo (usageHeader prog) flags)
+die (missing command\n ++ shortUsage prog)
 (_cmd:_) - do
-die (command-line syntax error\n ++
-usageInfo (usageHeader prog) flags)
+die (command-line syntax error\n ++ shortUsage prog)
 
 parseCheck :: ReadP a a - String - String - IO a
 parseCheck parser str what =



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


[commit: ghc] master: Remove unused PYTHON in build system (0bb2274)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/0bb2274f678678791247c8afec12eb9208f6b379

---

commit 0bb2274f678678791247c8afec12eb9208f6b379
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 12:07:07 2012 +

Remove unused PYTHON in build system

---

 configure.ac|4 
 mk/config.mk.in |1 -
 2 files changed, 0 insertions(+), 5 deletions(-)

diff --git a/configure.ac b/configure.ac
index 0651235..e5841ed 100644
--- a/configure.ac
+++ b/configure.ac
@@ -603,9 +603,6 @@ cygwin32|mingw32)
 ;;
 esac
 
-dnl ** check for Python
-AC_PATH_PROG(PythonCmd,python)
-
 dnl ** look for GCC and find out which version
 dnl Figure out which C compiler to use.  Gcc is preferred.
 dnl If gcc, make sure it's at least 3.0
@@ -1029,7 +1026,6 @@ echo [\
ld   : $LdCmd
Happy: $HappyCmd ($HappyVersion)
Alex : $AlexCmd ($AlexVersion)
-   Python   : $PythonCmd
Perl : $PerlCmd
dblatex  : $DblatexCmd
xsltproc : $XsltprocCmd]
diff --git a/mk/config.mk.in b/mk/config.mk.in
index 3d8ca8c..07de4c2 100644
--- a/mk/config.mk.in
+++ b/mk/config.mk.in
@@ -715,7 +715,6 @@ LN_S= @LN_S@
 MV = mv
 NROFF  = nroff
 PERL   = @PerlCmd@
-PYTHON = @PythonCmd@
 PIC= pic
 RANLIB = @RANLIB@
 SED= @SedCmd@



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


[commit: ghc] master: Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc (7009f58)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/7009f58005e29016b717c3954fc6c9a4330d9fa8

---

commit 7009f58005e29016b717c3954fc6c9a4330d9fa8
Merge: 7ee5bed... 495ef78...
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 14:03:04 2012 +

Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc

 compiler/main/InteractiveEval.hs |   10 ++
 ghc/InteractiveUI.hs |   22 --
 2 files changed, 18 insertions(+), 14 deletions(-)



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


[commit: ghc] master: Detab (e305fc7)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/e305fc74c22ff40d345780e418da0056eb3720df

---

commit e305fc74c22ff40d345780e418da0056eb3720df
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 14:13:36 2012 +

Detab

---

 compiler/parser/Parser.y.pp |2 +-
 1 files changed, 1 insertions(+), 1 deletions(-)

diff --git a/compiler/parser/Parser.y.pp b/compiler/parser/Parser.y.pp
index a7a327a..9db8f41 100644
--- a/compiler/parser/Parser.y.pp
+++ b/compiler/parser/Parser.y.pp
@@ -882,7 +882,7 @@ activation :: { Maybe Activation }
 explicit_activation :: { Activation }  -- In brackets
 : '[' INTEGER ']'   { ActiveAfter  (fromInteger 
(getINTEGER $2)) }
 | '[' '~' INTEGER ']'   { ActiveBefore (fromInteger 
(getINTEGER $3)) }
-   | '[' '~' ']'   { NeverActive }
+| '[' '~' ']'   { NeverActive }
 
 rule_forall :: { [RuleBndr RdrName] }
 : 'forall' rule_var_list '.'{ $2 }



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


[commit: ghc] master: Link in-tree libffi to rts. Fixes trac #5743. (7ee5bed)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/7ee5bedc5e5039c9bb3ba06b50a4395e579a4b0e

---

commit 7ee5bedc5e5039c9bb3ba06b50a4395e579a4b0e
Author: Peter Trommler ptromm...@acm.org
Date:   Fri Nov 30 13:40:10 2012 +0100

Link in-tree libffi to rts. Fixes trac #5743.

---

 rts/ghc.mk |6 ++
 1 files changed, 6 insertions(+), 0 deletions(-)

diff --git a/rts/ghc.mk b/rts/ghc.mk
index e3c9fa6..d605dff 100644
--- a/rts/ghc.mk
+++ b/rts/ghc.mk
@@ -194,6 +194,12 @@ $$(rts_$1_LIB) : $$(rts_$1_OBJS) $$(ALL_RTS_DEF_LIBS) 
rts/libs.depend rts/dist/b
$$(rts_dist_HC) -package-name rts -shared -dynamic -dynload deploy \
  -no-auto-link-packages -Lrts/dist/build -l$(LIBFFI_WINDOWS_LIB) `cat 
rts/libs.depend` $$(rts_$1_OBJS) $$(ALL_RTS_DEF_LIBS) -o $$@
 else
+ifneq $(UseSystemLibFFI) YES
+LIBFFI_LIBS = -Lrts/dist/build -lffi 
+else
+# flags will be taken care of in rts/libs.depend
+LIBFFI_LIBS =
+endif
 $$(rts_$1_LIB) : $$(rts_$1_OBJS) $$(rts_$1_DTRACE_OBJS) rts/libs.depend 
$$(rts_dist_FFI_SO)
$$(RM) $$(RM_OPTS) $$@
$$(rts_dist_HC) -package-name rts -shared -dynamic -dynload deploy \



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


RFC: Singleton equality witnesses

2012-11-30 Thread Gabor Greif
Hi all!

After encouragement from Iavor on G+, here is a patch that implements
a class method for singleton type equality witnesses in a generic way.

Please comment on two things:
  - is this a good approach?
  - how can we avoid abuse of SingEq (as it is type polymorphic, can this harm?)
  - (possibly) bikeshedding on names.

Cheers and thanks,

Gabor


TypeLits.hs.patch
Description: Binary data
___
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc


[commit: testsuite] master: Test for #7162: RULES that never fire automatically (44229bb)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/44229bb3bbe4ca3fa8223167f98c62315049efee

---

commit 44229bb3bbe4ca3fa8223167f98c62315049efee
Author: Andrew Farmer afar...@ittc.ku.edu
Date:   Thu Oct 4 16:53:55 2012 -0500

Test for #7162: RULES that never fire automatically

---

 tests/simplCore/should_compile/T7162.hs|9 +
 .../should_compile/T7162.stderr}   |0 
 tests/simplCore/should_compile/all.T   |1 +
 3 files changed, 10 insertions(+), 0 deletions(-)

diff --git a/tests/simplCore/should_compile/T7162.hs 
b/tests/simplCore/should_compile/T7162.hs
new file mode 100644
index 000..e09b921
--- /dev/null
+++ b/tests/simplCore/should_compile/T7162.hs
@@ -0,0 +1,9 @@
+import Data.Char
+
+{-# RULES map-loop [~] forall f . map' f = map' (id . f) #-}
+
+{-# NOINLINE map' #-}
+map' f [] = []
+map' f (x:xs) = f x : map' f xs
+
+main = print (map' toUpper Hello, World)
diff --git a/tests/annotations/should_compile/ann01.stderr 
b/tests/simplCore/should_compile/T7162.stderr
similarity index 100%
copy from tests/annotations/should_compile/ann01.stderr
copy to tests/simplCore/should_compile/T7162.stderr
diff --git a/tests/simplCore/should_compile/all.T 
b/tests/simplCore/should_compile/all.T
index e9b9aa3..7c7138d 100644
--- a/tests/simplCore/should_compile/all.T
+++ b/tests/simplCore/should_compile/all.T
@@ -35,6 +35,7 @@ test('spec003', normal, compile, [''])
 
 test('rule1', normal, compile, [''])
 test('rule2', only_ways(['optasm']), compile, ['-dsuppress-uniques'])
+test('T7162', normal, compile, [''])
 
 test('dfun-loop', normal, compile, [''])
 test('strict-float', normal, compile, [''])



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


[commit: testsuite] master: Use python2 if it exists. Based on a patch from michalt. Fixes #7333. (e7a338e)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/e7a338e13825524c5b9ea0354e633983acee4baf

---

commit e7a338e13825524c5b9ea0354e633983acee4baf
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 12:05:02 2012 +

Use python2 if it exists. Based on a patch from michalt. Fixes #7333.

---

 mk/boilerplate.mk |3 +++
 1 files changed, 3 insertions(+), 0 deletions(-)

diff --git a/mk/boilerplate.mk b/mk/boilerplate.mk
index 56b0284..f1cd6c8 100644
--- a/mk/boilerplate.mk
+++ b/mk/boilerplate.mk
@@ -126,6 +126,9 @@ GS = gs
 CP = cp
 RM = rm -f
 PYTHON = python
+ifeq $(shell $(SHELL) -c 'python2 -c 0' 2 /dev/null  echo exists) exists
+PYTHON = python2
+endif
 
 # -
 # configuration of TEST_HC



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


Re: RFC: Singleton equality witnesses

2012-11-30 Thread José Pedro Magalhães
Hi Gabor,

Only one (minor) comment: `SingEq` is not specific to singletons, is it? To
me it looks
like a kind-polymorphic type equality predicate, useful to have in several
situations.

Why not call the datatype (:==:), its constructor Refl, and put it in
GHC.Exts?
I guess that things like `Proxy` should probably go directly to GHC.Exts as
well...


Cheers,
Pedro

On Fri, Nov 30, 2012 at 2:13 PM, Gabor Greif ggr...@gmail.com wrote:

 Hi all!

 After encouragement from Iavor on G+, here is a patch that implements
 a class method for singleton type equality witnesses in a generic way.

 Please comment on two things:
   - is this a good approach?
   - how can we avoid abuse of SingEq (as it is type polymorphic, can this
 harm?)
   - (possibly) bikeshedding on names.

 Cheers and thanks,

 Gabor

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


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


[commit: ghc] master: typo (d53e222)

2012-11-30 Thread Gabor Greif
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/d53e222b16c5dc6971e6173f8d9e5dbced68265d

---

commit d53e222b16c5dc6971e6173f8d9e5dbced68265d
Author: Gabor Greif ggr...@gmail.com
Date:   Fri Nov 30 15:18:43 2012 +0100

typo

---

 compiler/iface/IfaceSyn.lhs |2 +-
 1 files changed, 1 insertions(+), 1 deletions(-)

diff --git a/compiler/iface/IfaceSyn.lhs b/compiler/iface/IfaceSyn.lhs
index 06c7b67..2f827ca 100644
--- a/compiler/iface/IfaceSyn.lhs
+++ b/compiler/iface/IfaceSyn.lhs
@@ -213,7 +213,7 @@ data IfaceIdInfo
 --  (In earlier GHCs we used to drop IdInfo immediately on reading,
 --   but we do not do that now.  Instead it's discarded when the
 --   ModIface is read into the various decl pools.)
---   * The version comparsion sees that new (=NoInfo) differs from old 
(=HasInfo *)
+--   * The version comparison sees that new (=NoInfo) differs from old 
(=HasInfo *)
 --  and so gives a new version.
 
 data IfaceInfoItem



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


Re: RFC: Singleton equality witnesses

2012-11-30 Thread Richard Eisenberg
I like the idea of being able to produce a witness of equality like this. I see 
that unsafeCoerce is necessary to write instances for Nat and Symbol, but it 
wouldn't be necessary for inductively defined singletons.

I don't think that sameSing should be in the SingE class, because not all 
singletons may want to support a notion of equality like this. SingE is 
designed to be applicable to all singletons refined from standard datatypes. I 
also agree with Pedro that your SingEq class is more widely applicable than 
just for singletons and should have a more general name.

Though it serves a different purpose, you may also want to check out the SEq 
class in the singletons package, viewable here: 
https://github.com/goldfirere/singletons/blob/master/devel/Data/Singletons.hs#L108
SEq only works with boolean equality, not propositional equality, so it surely 
solves a different problem.

One further thought: instead of just returning Nothing on disequality, what 
about using something like this (borrowing from Coq):

data a :==: b where
  Refl :: a :==: a
data EmptySet
type Not a = a - EmptySet
type DecidableEquality (a :: k) (b :: k) = Either (a :==: b) (Not (a :==: b))

class kparam ~ KindParam = DecEq (kparam :: OfKind k) where
  decEq :: forall (a :: k) (b :: k). Sing a - Sing b - DecidableEquality a b

instance DecEq (KindParam :: OfKind Nat) where
  decEq a b = if fromSing a == fromSing b
  then Left (unsafeCoerce Refl)
  else Right (\_ - undefined)

This may be overkill, but I would guess that something like the above is in the 
future for this approach…

Richard

On Nov 30, 2012, at 9:13 AM, Gabor Greif wrote:

 Hi all!
 
 After encouragement from Iavor on G+, here is a patch that implements
 a class method for singleton type equality witnesses in a generic way.
 
 Please comment on two things:
  - is this a good approach?
  - how can we avoid abuse of SingEq (as it is type polymorphic, can this 
 harm?)
  - (possibly) bikeshedding on names.
 
 Cheers and thanks,
 
Gabor
 TypeLits.hs.patch___
 Cvs-ghc mailing list
 Cvs-ghc@haskell.org
 http://www.haskell.org/mailman/listinfo/cvs-ghc


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


Re: [commit: ghc] master: Add :info! to GHCi. This shows all instances without filtering first. (2ec32a8)

2012-11-30 Thread Iavor Diatchki
Hello Simon,
there was no discussion because I thought that this would be completely
uncontroversial since: (i) it does not change the current behavior, and
(ii) it adds new functionality which is quite useful.
Here is the use case that motivated me to implement this (described by Eric
Mertens, cc-ed on this e-mail).  The example uses the `lens` package.

I know that Accessor has an Applicative instace because the operations
work.  I'd like to find the instance, so I can see how it works, so I try:

Prelude Control.Applicative Control.Lens :i Accessor
newtype Accessor r a
  = Control.Lens.Internal.Accessor {Control.Lens.Internal.runAccessor :: r}
  -- Defined in `Control.Lens.Internal'
instance Functor (Accessor r) -- Defined in `Control.Lens.Internal'
instance Gettable (Accessor r)
  -- Defined in `Control.Lens.Internal’

Weird, it doesn’t show up, so what are the instances of `Applicative`?

Prelude Control.Applicative Control.Lens :i Applicative
class Functor f = Applicative f where
  pure :: a - f a
  (*) :: f (a - b) - f a - f b
  (*) :: f a - f b - f b
  (*) :: f a - f b - f a
  -- Defined in `Control.Applicative'
instance Applicative [] -- Defined in `Control.Applicative'
instance Applicative ZipList -- Defined in `Control.Applicative'
instance Monad m = Applicative (WrappedMonad m)
  -- Defined in `Control.Applicative'
instance Applicative Maybe -- Defined in `Control.Applicative'
instance Applicative IO -- Defined in `Control.Applicative'
instance Applicative (Either e) -- Defined in `Control.Applicative'
instance Applicative ((-) a) -- Defined in `Control.Applicative'
instance Applicative Mutator -- Defined in `Control.Lens.Internal'
instance Applicative (Bazaar a b)
  -- Defined in `Control.Lens.Internal’

It does not show up, but I'm sure that there is an instance as the
operations seem to work! It turns out that the only way to find the
instance is to not only already know that there is one and import the
appropriate module, but to also import the modules used in the context. But
if I already knew all of this I wouldn't have asked GHCi.

Prelude Control.Applicative Control.Lens import Data.Monoid
Prelude Control.Applicative Control.Lens Data.Monoid :i Accessor
newtype Accessor r a
  = Control.Lens.Internal.Accessor {Control.Lens.Internal.runAccessor :: r}
  -- Defined in `Control.Lens.Internal'
instance Functor (Accessor r) -- Defined in `Control.Lens.Internal'
*instance Monoid r = Applicative (Accessor r)*
  -- Defined in `Control.Lens.Internal'
instance Gettable (Accessor r)
  -- Defined in `Control.Lens.Internal'

In contrast, with :info! we get everything that GHCi knows about, so it
is quite easy to figure out what's going on.

-Iavor





On Fri, Nov 30, 2012 at 3:42 AM, Simon Marlow marlo...@gmail.com wrote:

 On 30/11/12 02:03, Iavor Diatchki wrote:

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

 On branch  : master

 http://hackage.haskell.org/**trac/ghc/changeset/**
 2ec32a8e1cb323b230b0c228dbee31**3647892bf4http://hackage.haskell.org/trac/ghc/changeset/2ec32a8e1cb323b230b0c228dbee313647892bf4

  --**--**---


 commit 2ec32a8e1cb323b230b0c228dbee31**3647892bf4
 Author: Iavor S. Diatchki diatc...@galois.com
 Date:   Thu Nov 29 17:14:48 2012 -0800

  Add :info! to GHCi.  This shows all instances without filtering
 first.

  The default behavior of :info is to show only those instances of
  for a type, where all relevant type constructor names are in scope.
  This keeps down the number of instances shown to the user.

  In some cases, it is nice to be able to see all instances for a type.
  This patch implements this with the :info! command.


 Was there some discussion about this?  The last I remember was this:

 http://hackage.haskell.org/**trac/ghc/ticket/5998http://hackage.haskell.org/trac/ghc/ticket/5998

 where we decided not to implement this because it is essentially a random
 UI: the behaviour can't be described sensibly because it depends on which
 interface files GHC happens to have seen so far.

 There's also this:

 http://hackage.haskell.org/**trac/ghc/ticket/3080http://hackage.haskell.org/trac/ghc/ticket/3080

 which looks like a duplicate (I just closed it).

 Cheers,
 Simon




 __**_
 Cvs-ghc mailing list
 Cvs-ghc@haskell.org
 http://www.haskell.org/**mailman/listinfo/cvs-ghchttp://www.haskell.org/mailman/listinfo/cvs-ghc

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


[commit: ghc] master: Update dependencies (d2ff25f)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/d2ff25f8a38466753f403278dbae5bd7f4829142

---

commit d2ff25f8a38466753f403278dbae5bd7f4829142
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 17:55:56 2012 +

Update dependencies

---

 compiler/ghc.cabal.in|2 +-
 ghc/ghc-bin.cabal.in |2 +-
 utils/ghc-pkg/ghc-pkg.cabal  |2 +-
 utils/runghc/runghc.cabal.in |2 +-
 4 files changed, 4 insertions(+), 4 deletions(-)

diff --git a/compiler/ghc.cabal.in b/compiler/ghc.cabal.in
index d2ef375..a9dd62b 100644
--- a/compiler/ghc.cabal.in
+++ b/compiler/ghc.cabal.in
@@ -50,7 +50,7 @@ Library
 
 Build-Depends: base   = 4 5,
directory  = 1 1.3,
-   process= 1 1.2,
+   process= 1 1.3,
bytestring = 0.9   0.11,
time  1.5,
containers = 0.1   0.6,
diff --git a/ghc/ghc-bin.cabal.in b/ghc/ghc-bin.cabal.in
index 40dc858..36fc9d4 100644
--- a/ghc/ghc-bin.cabal.in
+++ b/ghc/ghc-bin.cabal.in
@@ -29,7 +29,7 @@ Executable ghc
array  = 0.1   0.5,
bytestring = 0.9   0.11,
directory  = 1 1.3,
-   process= 1 1.2,
+   process= 1 1.3,
filepath   = 1 1.4,
ghc
 if os(windows)
diff --git a/utils/ghc-pkg/ghc-pkg.cabal b/utils/ghc-pkg/ghc-pkg.cabal
index d437882..e7f1d53 100644
--- a/utils/ghc-pkg/ghc-pkg.cabal
+++ b/utils/ghc-pkg/ghc-pkg.cabal
@@ -20,7 +20,7 @@ Executable ghc-pkg
 
 Build-Depends: base   = 4 5,
directory  = 1 1.3,
-   process= 1 1.2,
+   process= 1 1.3,
filepath,
Cabal,
binary,
diff --git a/utils/runghc/runghc.cabal.in b/utils/runghc/runghc.cabal.in
index 333ed20..f9cbacc 100644
--- a/utils/runghc/runghc.cabal.in
+++ b/utils/runghc/runghc.cabal.in
@@ -21,7 +21,7 @@ Executable runghc
 if flag(base3)
 Build-Depends: base   = 3 5,
directory  = 1 1.3,
-   process= 1 1.2
+   process= 1 1.3
 else
 Build-Depends: base  3
 Build-Depends: filepath



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


[commit: ghc] master: Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc (cfb9696)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/cfb9696034a96abc17569bcb743adc46f97e9811

---

commit cfb9696034a96abc17569bcb743adc46f97e9811
Merge: 4ef1bd4... d53e222...
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 18:51:58 2012 +

Merge branch 'master' of darcs.haskell.org:/srv/darcs//ghc

 compiler/iface/IfaceSyn.lhs |2 +-
 1 files changed, 1 insertions(+), 1 deletions(-)



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


[commit: ghc] master: Update submodules (4ef1bd4)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/ghc

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/4ef1bd4e58f43b5baa3b6c5a7172b2dc8fd6c0f2

---

commit 4ef1bd4e58f43b5baa3b6c5a7172b2dc8fd6c0f2
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 18:50:29 2012 +

Update submodules

---

 libraries/Cabal |2 +-
 libraries/haskeline |2 +-
 2 files changed, 2 insertions(+), 2 deletions(-)

diff --git a/libraries/Cabal b/libraries/Cabal
index 532e349..4b43bd9 16
--- a/libraries/Cabal
+++ b/libraries/Cabal
@@ -1 +1 @@
-Subproject commit 532e349ec6ee33fc3477137b44f108d3658d0528
+Subproject commit 4b43bd95753e5f3e29d7bfbe6bba8477715ac296
diff --git a/libraries/haskeline b/libraries/haskeline
index 9ad0092..80335c0 16
--- a/libraries/haskeline
+++ b/libraries/haskeline
@@ -1 +1 @@
-Subproject commit 9ad00926f832f4e5f5d38c8fe84bfc85f4e8f728
+Subproject commit 80335c06e94b977640da3bf995ed1360bd9c549e



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


Re: RFC: Singleton equality witnesses

2012-11-30 Thread Iavor Diatchki
Hello,
Here are my thoughts:
  * I agree that we should use (:==:) for the name, as it is not specific
to singletons.
  * I don't think that we need the Coq style `Not` as in Haskell we already
have this function anyway, so the `Right` case would not be giving any new
information and just making things more complex.
  * I tend to agree that perhaps this should be a separate class.
  * I think that, perhaps, the new class should have `SingE` as a super
class.  Not sure about that though, what do you guys think?

A tangentially related idea.  I was wondering if, perhaps, we should make *
be part of the singleton framework, it seems to fit rather naturally, with
TypeReps as evidence,
and it serves a similar purpose to `Proxy`.  Here's the implementation:

newtype instance Sing (x :: *) = SingT TypeRep

instance Typeable a = SingI (a :: *) where
  sing = mk undefined -- or just use scoped type variables
where mk :: Typeable a = a - Sing a
  mk = SingT . typeOf

instance SingE (KindParam :: OfKind *) where
  type DemoteRep (KindParam :: OfKind *) = TypeRep
  fromSing (SingT t) = t

Pedro, would that fit the new version of typeable that you've been working
on?

-Iavor





On Fri, Nov 30, 2012 at 7:56 AM, Richard Eisenberg e...@cis.upenn.eduwrote:

 I like the idea of being able to produce a witness of equality like this.
 I see that unsafeCoerce is necessary to write instances for Nat and Symbol,
 but it wouldn't be necessary for inductively defined singletons.

 I don't think that sameSing should be in the SingE class, because not all
 singletons may want to support a notion of equality like this. SingE is
 designed to be applicable to all singletons refined from standard
 datatypes. I also agree with Pedro that your SingEq class is more widely
 applicable than just for singletons and should have a more general name.

 Though it serves a different purpose, you may also want to check out the
 SEq class in the singletons package, viewable here:
 https://github.com/goldfirere/singletons/blob/master/devel/Data/Singletons.hs#L108
 SEq only works with boolean equality, not propositional equality, so it
 surely solves a different problem.

 One further thought: instead of just returning Nothing on disequality,
 what about using something like this (borrowing from Coq):

 data a :==: b where
   Refl :: a :==: a
 data EmptySet
 type Not a = a - EmptySet
 type DecidableEquality (a :: k) (b :: k) = Either (a :==: b) (Not (a :==:
 b))

 class kparam ~ KindParam = DecEq (kparam :: OfKind k) where
   decEq :: forall (a :: k) (b :: k). Sing a - Sing b - DecidableEquality
 a b

 instance DecEq (KindParam :: OfKind Nat) where
   decEq a b = if fromSing a == fromSing b
   then Left (unsafeCoerce Refl)
   else Right (\_ - undefined)

 This may be overkill, but I would guess that something like the above is
 in the future for this approach…

 Richard

 On Nov 30, 2012, at 9:13 AM, Gabor Greif wrote:

  Hi all!
 
  After encouragement from Iavor on G+, here is a patch that implements
  a class method for singleton type equality witnesses in a generic way.
 
  Please comment on two things:
   - is this a good approach?
   - how can we avoid abuse of SingEq (as it is type polymorphic, can this
 harm?)
   - (possibly) bikeshedding on names.
 
  Cheers and thanks,
 
 Gabor
  TypeLits.hs.patch___
  Cvs-ghc mailing list
  Cvs-ghc@haskell.org
  http://www.haskell.org/mailman/listinfo/cvs-ghc


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

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


[commit: hsc2hs] master: Update dependencies (516202b)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/hsc2hs

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/516202badf2973c29b7f4b5969037b186b654998

---

commit 516202badf2973c29b7f4b5969037b186b654998
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 17:56:03 2012 +

Update dependencies

---

 hsc2hs.cabal |2 +-
 1 files changed, 1 insertions(+), 1 deletions(-)

diff --git a/hsc2hs.cabal b/hsc2hs.cabal
index 36323b2..123be3a 100644
--- a/hsc2hs.cabal
+++ b/hsc2hs.cabal
@@ -40,5 +40,5 @@ Executable hsc2hs
containers = 0.2   0.6,
directory  = 1 1.3,
filepath   = 1 1.4,
-   process= 1 1.2
+   process= 1 1.3
 



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


[commit: testsuite] master: Make some tests independent of the version number of the array package (b593173)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/b593173118d687dd4a61a8dffb7781e7300958f4

---

commit b593173118d687dd4a61a8dffb7781e7300958f4
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 18:41:32 2012 +

Make some tests independent of the version number of the array package

---

 tests/safeHaskell/check/pkg01/all.T |6 +-
 tests/th/T5358.stderr   |8 
 tests/th/all.T  |2 +-
 3 files changed, 6 insertions(+), 10 deletions(-)

diff --git a/tests/safeHaskell/check/pkg01/all.T 
b/tests/safeHaskell/check/pkg01/all.T
index 2d9e5d7..7c0b411 100644
--- a/tests/safeHaskell/check/pkg01/all.T
+++ b/tests/safeHaskell/check/pkg01/all.T
@@ -2,6 +2,9 @@
 def f( opts ):
   opts.only_ways = ['normal']
 
+def normaliseArrayPackage(str):
+return re.sub('array-[0-9]+(\.[0-9]+)*', 'array-VERSION', str)
+
 def normaliseBytestringPackage(str):
 return re.sub('bytestring-[0-9]+(\.[0-9]+)*', 'bytestring-VERSION', str)
 
@@ -28,7 +31,8 @@ make_args = 'VANILLA=' + vanilla + ' PROF=' + prof + ' DYN=' 
+ dyn
 # and can be changed correctly
 test('safePkg01',
  [clean_cmd('$MAKE -s --no-print-directory 
cleanPackageDatabase.safePkg01'),
-  normalise_fun(normaliseBytestringPackage)],
+  two_normalisers(normalise_fun(normaliseArrayPackage),
+  normalise_fun(normaliseBytestringPackage))],
  run_command, 
  ['$MAKE -s --no-print-directory safePkg01 ' + make_args])
 
diff --git a/tests/th/T5358.stderr b/tests/th/T5358.stderr
index 5c9e68c..26c8375 100644
--- a/tests/th/T5358.stderr
+++ b/tests/th/T5358.stderr
@@ -1,11 +1,3 @@
-Loading package ghc-prim ... linking ... done.
-Loading package integer-gmp ... linking ... done.
-Loading package base ... linking ... done.
-Loading package array-0.4.0.1 ... linking ... done.
-Loading package deepseq-1.3.0.1 ... linking ... done.
-Loading package containers-0.5.0.0 ... linking ... done.
-Loading package pretty-1.1.1.0 ... linking ... done.
-Loading package template-haskell ... linking ... done.
 
 T5358.hs:7:1:
 Couldn't match expected type `t1 - t1' with actual type `Int'
diff --git a/tests/th/all.T b/tests/th/all.T
index d74bbea..07faaf7 100644
--- a/tests/th/all.T
+++ b/tests/th/all.T
@@ -196,7 +196,7 @@ test('TH_unresolvedInfix2',
  compile_fail,
  ['-v0'])
 
-test('T5358', normal, compile_fail, [''])
+test('T5358', normal, compile_fail, [' -v0'])
 test('T5379', normal, compile_and_run, [''])
 test('T5404', normal, compile, ['-v0'])
 test('T5410', normal, compile_and_run, ['-v0'])



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


Re: RFC: Singleton equality witnesses

2012-11-30 Thread Gábor Lehel
On Fri, Nov 30, 2012 at 7:58 PM, Iavor Diatchki
iavor.diatc...@gmail.com wrote:
 Hello,
 Here are my thoughts:
   * I agree that we should use (:==:) for the name, as it is not specific to
 singletons.

Apologies for the bikeshedding, but why not (:~:)?



-- 
Your ship was destroyed in a monadic eruption.

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


[nightly] 30-Nov-2012 build of HEAD (unreg) on x86_64-unknown-linux (cam-04-unx)

2012-11-30 Thread GHC Build Reports
Build description = HEAD (unreg) on x86_64-unknown-linux (cam-04-unx)
Build location= /64playpen/simonmar/nightly/HEAD-unreg-cam-04-unx
Build config file = /home/simonmar/nightly/site/msrc/conf-HEAD-unreg-cam-04-unx

Nightly build started on cam-04-unx at Fri Nov 30 18:20:01 GMT 2012.
 checking out new source tree ... warning: libraries/binary 
already present; omitting
warning: libraries/bytestring already present; omitting
warning: libraries/Cabal already present; omitting
warning: libraries/containers already present; omitting
warning: libraries/haskeline already present; omitting
warning: libraries/pretty already present; omitting
warning: libraries/terminfo already present; omitting
warning: libraries/transformers already present; omitting
warning: libraries/Win32 already present; omitting
warning: libraries/xhtml already present; omitting
warning: libraries/primitive already present; omitting
warning: libraries/vector already present; omitting
Submodule 'libraries/Cabal' (http://darcs.haskell.org/libraries/Cabal.git/) 
registered for path 'libraries/Cabal'
Submodule 'libraries/Win32' (http://darcs.haskell.org/libraries/Win32.git/) 
registered for path 'libraries/Win32'
Submodule 'libraries/binary' (http://darcs.haskell.org/libraries/binary.git/) 
registered for path 'libraries/binary'
Submodule 'libraries/bytestring' 
(http://darcs.haskell.org/libraries/bytestring.git/) registered for path 
'libraries/bytestring'
Submodule 'libraries/containers' 
(http://darcs.haskell.org/libraries/containers.git/) registered for path 
'libraries/containers'
Submodule 'libraries/haskeline' 
(http://darcs.haskell.org/libraries/haskeline.git/) registered for path 
'libraries/haskeline'
Submodule 'libraries/pretty' (http://darcs.haskell.org/libraries/pretty.git/) 
registered for path 'libraries/pretty'
Submodule 'libraries/primitive' 
(http://darcs.haskell.org/libraries/primitive.git/) registered for path 
'libraries/primitive'
Submodule 'libraries/terminfo' 
(http://darcs.haskell.org/libraries/terminfo.git/) registered for path 
'libraries/terminfo'
Submodule 'libraries/transformers' 
(http://darcs.haskell.org/libraries/transformers.git/) registered for path 
'libraries/transformers'
Submodule 'libraries/vector' (http://darcs.haskell.org/libraries/vector.git/) 
registered for path 'libraries/vector'
Submodule 'libraries/xhtml' (http://darcs.haskell.org/libraries/xhtml.git/) 
registered for path 'libraries/xhtml'
Cloning into 'libraries/Cabal'...
Submodule path 'libraries/Cabal': checked out 
'532e349ec6ee33fc3477137b44f108d3658d0528'
Cloning into 'libraries/Win32'...
Submodule path 'libraries/Win32': checked out 
'21335a30161c099da79ae9619c9782e5e32e4644'
Cloning into 'libraries/binary'...
Submodule path 'libraries/binary': checked out 
'2d31cea238d0d08885c457475fc354dbf2b88976'
Cloning into 'libraries/bytestring'...
Submodule path 'libraries/bytestring': checked out 
'6bd69fe27af33e878e38f4c579983f6a23120a87'
Cloning into 'libraries/containers'...
Submodule path 'libraries/containers': checked out 
'a9b7224068ae60f73baacd5f76d2c27624d90120'
Cloning into 'libraries/haskeline'...
Submodule path 'libraries/haskeline': checked out 
'9ad00926f832f4e5f5d38c8fe84bfc85f4e8f728'
Cloning into 'libraries/pretty'...
Submodule path 'libraries/pretty': checked out 
'ab7e8d91470bb94c9e184dffbec89d0aae116f9b'
Cloning into 'libraries/primitive'...
Submodule path 'libraries/primitive': checked out 
'75c3379b6d76e914cc3c7ffd290b6b1cad7ea3e6'
Cloning into 'libraries/terminfo'...
Submodule path 'libraries/terminfo': checked out 
'579d2c324e69856ff8d1ea8b5036e30c920e1973'
Cloning into 'libraries/transformers'...
Submodule path 'libraries/transformers': checked out 
'a59fb93860f84ccd44178dcbbb82cfea7e02cd07'
Cloning into 'libraries/vector'...
Submodule path 'libraries/vector': checked out 
'c4c5a740ec977a4300449bc85f4707ec641be923'
Cloning into 'libraries/xhtml'...
Submodule path 'libraries/xhtml': checked out 
'fb9e0bbb69e15873682a9f25d39652099a3ccac1'
ok.
 Building stage 1 compiler... ok.
GHC Version 7.7
 Building stage 2 compiler... failed; relevant barfage 
is below.
 building testsuite tools ... failed.
 running nofib (-rtsopts -O2) ... ok.
-
Respository hashes:
.|d53e222b16c5dc6971e6173f8d9e5dbced68265d
ghc-tarballs|18e0c37f8023abf469af991e2fc2d3b024319c27
libraries/array|a24f9848dc1d19829d9b8f1335cc1d6662f95140
libraries/base|bab62355c09b1c07d53aa15b28e0893089049f8d
libraries/deepseq|4821349305c2a73efacdd58d2ba485b07eb84eda
libraries/directory|ae1704201bdee2be29a3a6a59a42b240f6180353
libraries/dph|f7e5bfc37e7be72e45a7d3cacfb16f9e829a6eb1
libraries/filepath|2d60d0dd5d8fc924420bb238902266929f4e2cfb
libraries/ghc-prim|d075da650b22fee284a82162c5b78757f30fe2ae
libraries/haskell2010|d7e33da36585c250cd0bfb45b518c95e44197f3c

am-deb7-64 (HEAD), build 255, Failure

2012-11-30 Thread Builder
am-deb7-64 (HEAD), build 255

Build failed
Details: http://darcs.haskell.org/ghcBuilder/builders/am-deb7-64/255.html

git clone| Success
create mk/build.mk   | Success
get subrepos | Success
repo versions| Success
touching clean-check files   | Success
setting version date | Success
booting  | Success
configuring  | Success
creating check-remove-before | Success
compiling| Failure: Just (ExitFailure 2)

Build failed
Details: http://darcs.haskell.org/ghcBuilder/builders/am-deb7-64/255.html

ghc-7.7.20121127: cannot find any of 
[SPARC/CodeGen/Sanity.hi,SPARC/CodeGen/Sanity.p_hi,SPARC/CodeGen/Sanity.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[SPARC/CodeGen/Expand.hi,SPARC/CodeGen/Expand.p_hi,SPARC/CodeGen/Expand.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Liveness.hi,RegAlloc/Liveness.p_hi,RegAlloc/Liveness.dyn_hi] 
(ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/Main.hi,RegAlloc/Graph/Main.p_hi,RegAlloc/Graph/Main.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/Stats.hi,RegAlloc/Graph/Stats.p_hi,RegAlloc/Graph/Stats.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/ArchBase.hi,RegAlloc/Graph/ArchBase.p_hi,RegAlloc/Graph/ArchBase.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/ArchX86.hi,RegAlloc/Graph/ArchX86.p_hi,RegAlloc/Graph/ArchX86.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/Coalesce.hi,RegAlloc/Graph/Coalesce.p_hi,RegAlloc/Graph/Coalesce.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/Spill.hi,RegAlloc/Graph/Spill.p_hi,RegAlloc/Graph/Spill.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/SpillClean.hi,RegAlloc/Graph/SpillClean.p_hi,RegAlloc/Graph/SpillClean.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/SpillCost.hi,RegAlloc/Graph/SpillCost.p_hi,RegAlloc/Graph/SpillCost.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Graph/TrivColorable.hi,RegAlloc/Graph/TrivColorable.p_hi,RegAlloc/Graph/TrivColorable.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/Main.hi,RegAlloc/Linear/Main.p_hi,RegAlloc/Linear/Main.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/JoinToTargets.hi,RegAlloc/Linear/JoinToTargets.p_hi,RegAlloc/Linear/JoinToTargets.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/State.hi,RegAlloc/Linear/State.p_hi,RegAlloc/Linear/State.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/Stats.hi,RegAlloc/Linear/Stats.p_hi,RegAlloc/Linear/Stats.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/FreeRegs.hi,RegAlloc/Linear/FreeRegs.p_hi,RegAlloc/Linear/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/StackMap.hi,RegAlloc/Linear/StackMap.p_hi,RegAlloc/Linear/StackMap.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/Base.hi,RegAlloc/Linear/Base.p_hi,RegAlloc/Linear/Base.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/X86/FreeRegs.hi,RegAlloc/Linear/X86/FreeRegs.p_hi,RegAlloc/Linear/X86/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/X86_64/FreeRegs.hi,RegAlloc/Linear/X86_64/FreeRegs.p_hi,RegAlloc/Linear/X86_64/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/PPC/FreeRegs.hi,RegAlloc/Linear/PPC/FreeRegs.p_hi,RegAlloc/Linear/PPC/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[RegAlloc/Linear/SPARC/FreeRegs.hi,RegAlloc/Linear/SPARC/FreeRegs.p_hi,RegAlloc/Linear/SPARC/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121127: cannot find any of 
[libHSghc-7.7.20121127.a,libHSghc-7.7.20121127.p_a,libHSghc-7.7.20121127-ghc7.7.20121127.so,libHSghc-7.7.20121127-ghc7.7.20121127.dylib,HSghc-7.7.20121127-ghc7.7.20121127.dll]
 on library path (ignoring)
CROSS_COMPILE= inplace/bin/ghc-cabal configure 
--with-ghc=/home/butler/b/builder/tempbuild/build/inplace/bin/ghc-stage1 
--with-ghc-pkg=/home/butler/b/builder/tempbuild/build/inplace/bin/ghc-pkg 
--flag in-ghc-tree --disable-library-vanilla --disable-library-profiling 
--disable-shared --disable-library-for-ghci --enable-library-for-ghci 
--with-hscolour=/usr/bin/HsColour --configure-option=CFLAGS= 
-fno-stack-protector--configure-option=LDFLAGS= -Wl,--hash-size=31 
-Wl,--reduce-memory-overheads   --configure-option=CPPFLAGS=
--with-gcc=/usr/bin/gcc --configure-option=--with-cc=/usr/bin/gcc 
--with-ar=/usr/bin/ar --with-ranlib=true --with-alex=/usr/bin/alex 
--with-happy=/usr/bin/happy -- dist utils/haddock
Configuring haddock-2.11.0...
ghc-cabal: At least the following dependencies are missing:
base =4.3  4.7
make[1]: *** [utils/haddock/dist/package-data.mk] Error 1
make: *** [all] Error 2

[commit: haddock] master: Update dependencies (de8476a)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/haddock

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/de8476a481867f986221a1f1d6829731d293e03b

---

commit de8476a481867f986221a1f1d6829731d293e03b
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 23:20:47 2012 +

Update dependencies

---

 haddock.cabal |4 ++--
 1 files changed, 2 insertions(+), 2 deletions(-)

diff --git a/haddock.cabal b/haddock.cabal
index 91deca1..ddf0ce6 100644
--- a/haddock.cabal
+++ b/haddock.cabal
@@ -83,7 +83,7 @@ executable haddock
   if !flag(in-ghc-tree)
 build-tools: alex = 2.3, happy = 1.18
   build-depends:
-base = 4.3   4.7,
+base = 4.3   4.8,
 filepath,
 directory,
 pretty,
@@ -146,7 +146,7 @@ library
   if !flag(in-ghc-tree)
 build-tools: alex = 2.3, happy = 1.18
   build-depends:
-base = 4.3   4.7,
+base = 4.3   4.8,
 filepath,
 directory,
 pretty,



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


[commit: testsuite] master: Fix safePkg01 (f639a1b)

2012-11-30 Thread Ian Lynagh
Repository : ssh://darcs.haskell.org//srv/darcs/testsuite

On branch  : master

http://hackage.haskell.org/trac/ghc/changeset/f639a1b64cb734d5013b734f955afb3c799522e0

---

commit f639a1b64cb734d5013b734f955afb3c799522e0
Author: Ian Lynagh i...@well-typed.com
Date:   Fri Nov 30 23:28:04 2012 +

Fix safePkg01

---

 tests/safeHaskell/check/pkg01/all.T |4 ++--
 1 files changed, 2 insertions(+), 2 deletions(-)

diff --git a/tests/safeHaskell/check/pkg01/all.T 
b/tests/safeHaskell/check/pkg01/all.T
index 7c0b411..0f5f202 100644
--- a/tests/safeHaskell/check/pkg01/all.T
+++ b/tests/safeHaskell/check/pkg01/all.T
@@ -31,8 +31,8 @@ make_args = 'VANILLA=' + vanilla + ' PROF=' + prof + ' DYN=' 
+ dyn
 # and can be changed correctly
 test('safePkg01',
  [clean_cmd('$MAKE -s --no-print-directory 
cleanPackageDatabase.safePkg01'),
-  two_normalisers(normalise_fun(normaliseArrayPackage),
-  normalise_fun(normaliseBytestringPackage))],
+  normalise_fun(two_normalisers(normaliseArrayPackage,
+normaliseBytestringPackage))],
  run_command, 
  ['$MAKE -s --no-print-directory safePkg01 ' + make_args])
 



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


tn23 (x86 OSX HEAD), build 771, Failure

2012-11-30 Thread Builder
tn23 (x86 OSX HEAD), build 771

Build failed
Details: http://darcs.haskell.org/ghcBuilder/builders/tn23/771.html

git clone| Success
create mk/build.mk   | Success
get subrepos | Success
repo versions| Success
touching clean-check files   | Success
setting version date | Success
booting  | Success
configuring  | Success
creating check-remove-before | Success
compiling| Failure: Just (ExitFailure 2)

Build failed
Details: http://darcs.haskell.org/ghcBuilder/builders/tn23/771.html

ghc-7.7.20121201: cannot find any of 
[SPARC/CodeGen/Sanity.hi,SPARC/CodeGen/Sanity.p_hi,SPARC/CodeGen/Sanity.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[SPARC/CodeGen/Expand.hi,SPARC/CodeGen/Expand.p_hi,SPARC/CodeGen/Expand.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Liveness.hi,RegAlloc/Liveness.p_hi,RegAlloc/Liveness.dyn_hi] 
(ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/Main.hi,RegAlloc/Graph/Main.p_hi,RegAlloc/Graph/Main.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/Stats.hi,RegAlloc/Graph/Stats.p_hi,RegAlloc/Graph/Stats.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/ArchBase.hi,RegAlloc/Graph/ArchBase.p_hi,RegAlloc/Graph/ArchBase.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/ArchX86.hi,RegAlloc/Graph/ArchX86.p_hi,RegAlloc/Graph/ArchX86.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/Coalesce.hi,RegAlloc/Graph/Coalesce.p_hi,RegAlloc/Graph/Coalesce.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/Spill.hi,RegAlloc/Graph/Spill.p_hi,RegAlloc/Graph/Spill.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/SpillClean.hi,RegAlloc/Graph/SpillClean.p_hi,RegAlloc/Graph/SpillClean.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/SpillCost.hi,RegAlloc/Graph/SpillCost.p_hi,RegAlloc/Graph/SpillCost.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Graph/TrivColorable.hi,RegAlloc/Graph/TrivColorable.p_hi,RegAlloc/Graph/TrivColorable.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/Main.hi,RegAlloc/Linear/Main.p_hi,RegAlloc/Linear/Main.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/JoinToTargets.hi,RegAlloc/Linear/JoinToTargets.p_hi,RegAlloc/Linear/JoinToTargets.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/State.hi,RegAlloc/Linear/State.p_hi,RegAlloc/Linear/State.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/Stats.hi,RegAlloc/Linear/Stats.p_hi,RegAlloc/Linear/Stats.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/FreeRegs.hi,RegAlloc/Linear/FreeRegs.p_hi,RegAlloc/Linear/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/StackMap.hi,RegAlloc/Linear/StackMap.p_hi,RegAlloc/Linear/StackMap.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/Base.hi,RegAlloc/Linear/Base.p_hi,RegAlloc/Linear/Base.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/X86/FreeRegs.hi,RegAlloc/Linear/X86/FreeRegs.p_hi,RegAlloc/Linear/X86/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/X86_64/FreeRegs.hi,RegAlloc/Linear/X86_64/FreeRegs.p_hi,RegAlloc/Linear/X86_64/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/PPC/FreeRegs.hi,RegAlloc/Linear/PPC/FreeRegs.p_hi,RegAlloc/Linear/PPC/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[RegAlloc/Linear/SPARC/FreeRegs.hi,RegAlloc/Linear/SPARC/FreeRegs.p_hi,RegAlloc/Linear/SPARC/FreeRegs.dyn_hi]
 (ignoring)
ghc-7.7.20121201: cannot find any of 
[libHSghc-7.7.20121201.a,libHSghc-7.7.20121201.p_a,libHSghc-7.7.20121201-ghc7.7.20121201.so,libHSghc-7.7.20121201-ghc7.7.20121201.dylib,HSghc-7.7.20121201-ghc7.7.20121201.dll]
 on library path (ignoring)
CROSS_COMPILE= inplace/bin/ghc-cabal configure 
--with-ghc=/Users/thorkilnaur/tn/builders/GHCBuilder/tn23/builder/tempbuild/build/inplace/bin/ghc-stage1
 
--with-ghc-pkg=/Users/thorkilnaur/tn/builders/GHCBuilder/tn23/builder/tempbuild/build/inplace/bin/ghc-pkg
 --flag in-ghc-tree --disable-library-vanilla --disable-library-profiling 
--disable-shared --disable-library-for-ghci --enable-library-for-ghci 
--with-hscolour=/Users/thorkilnaur/tn/install/hscolour-1.10.1/bin/HsColour 
--configure-option=CFLAGS= -m32 -fno-stack-protector
--configure-option=LDFLAGS= -m32   --configure-option=CPPFLAGS= -m32   
--with-gcc=/usr/bin/gcc --configure-option=--with-cc=/usr/bin/gcc 
--with-ar=/usr/bin/ar --with-ranlib=ranlib 
--with-alex=/Users/thorkilnaur/tn/install/alex-3.0.1/bin/alex 
--with-happy=/Users/thorkilnaur/tn/install/happy-1.18.6/bin/happy -- dist 
utils/haddock
Configuring haddock-2.11.0...
ghc-cabal: At least 

[nightly] 30-Nov-2012 build of STABLE on x86_64-unknown-linux (cam-04-unx)

2012-11-30 Thread GHC Build Reports
Build description = STABLE on x86_64-unknown-linux (cam-04-unx)
Build location= /64playpen/simonmar/nightly/STABLE-cam-04-unx
Build config file = /home/simonmar/nightly/site/msrc/conf-STABLE-cam-04-unx

Nightly build started on cam-04-unx at Fri Nov 30 18:10:01 GMT 2012.
 checking out new source tree ... warning: Remote branch 
ghc-7.6 not found in upstream origin, using HEAD instead
ok.
 Building stage 1 compiler... ok.
GHC Version 7.6.1.20121129
 Building stage 2 compiler... ok.
 Building stage 3 compiler... ok.
 building source distribution ... ok.
 uploading source distribution... ok.
 building testsuite tools ... ok.
 running tests... ok (summary below).
 building compiler binary distribution... ok.
 uploading binary distribution... ok.
 running nofib (-rtsopts -O2) ... ok.
 running nofib (-rtsopts -O2 -fllvm)  ... ok.
 running nofib (-rtsopts -O2 -prof -auto-all -static)... ok.
 running nofib (-rtsopts -O2 -prof -auto-all -fllvm -static)... ok.
 publishing logs  ... ok.
Logs  are at http://www.haskell.org/ghc/dist/stable/logs
Dists are at http://www.haskell.org/ghc/dist/stable/dist
Docs  are at http://www.haskell.org/ghc/dist/stable/docs
-
Respository hashes:
.|c9c8b4059aeb2e20ddb4000194dbd44db0c3559d
ghc-tarballs|18e0c37f8023abf469af991e2fc2d3b024319c27
libraries/Cabal|e7e7ce1029707a67d26e6dc29de11141734898e3
libraries/Win32|e13098aecd0489399435dbf8643e1db2272e1e02
libraries/array|8dcd15240a9c2ba142fcbd31f597b51cf2f560bf
libraries/base|066fb9edecb3f293dbab36b87317100722a3c57c
libraries/binary|2d31cea238d0d08885c457475fc354dbf2b88976
libraries/bytestring|65e40bdf5b3a2484b36221a71b054e4400361a5f
libraries/containers|a9b7224068ae60f73baacd5f76d2c27624d90120
libraries/deepseq|4821349305c2a73efacdd58d2ba485b07eb84eda
libraries/directory|ef17afe1bd44ae10ef413146e5ade8867cb05625
libraries/filepath|2d60d0dd5d8fc924420bb238902266929f4e2cfb
libraries/ghc-prim|03144fbee792555bfd6de6184228ebaeffed2896
libraries/haskeline|f4040ab5831866c260e03fc8601edf7e1ed77049
libraries/haskell2010|d7e33da36585c250cd0bfb45b518c95e44197f3c
libraries/haskell98|c5a0db5eb4ce6a3736bf4f5caac3ff465b3dbaf9
libraries/hoopl|293d339303097641e7f14a1c0365a3801a87918d
libraries/hpc|c1b783dbbb0ab917208655c53a0af5c7538c2a0b
libraries/integer-gmp|2d9eca147f5c8b6f390eca15e03b315f67f2df01
libraries/integer-simple|47737f6f16d891b743a3d02b0a016100fd3a36d1
libraries/old-locale|47542432234f6fc406a9abf5d3f94e43d9bd10f6
libraries/old-time|cf225c367e5490201a5b04b1b8cb322f6e230d46
libraries/pretty|0a22cc0b3a4f8db876c4019013a30bfd1c0dd9a2
libraries/process|0ab69a65edae8c1a34ecee3a97b3839c833985f2
libraries/template-haskell|db0b4de55926b0bc98717c92ba543bcf9b89d024
libraries/terminfo|579d2c324e69856ff8d1ea8b5036e30c920e1973
libraries/transformers|a59fb93860f84ccd44178dcbbb82cfea7e02cd07
libraries/unix|de870e706fe7bac6f013c910d14721dc9387e30e
libraries/utf8-string|73ca1b9def3f350ad28e55fcba077e6be3b67e93
libraries/xhtml|fb9e0bbb69e15873682a9f25d39652099a3ccac1
nofib|f0082fddac1f13c5d032c230f8cdff94bf163ef0
testsuite|c96a151e2e48092efe58bfb2ba11aad428480b27
utils/haddock|1d480b49a2d9098993889ca29dd82ef228ae5c0d
utils/hsc2hs|67b8c663216690150b6f762e09b32ebbe6334ddd
-
All done!
Nightly build finished successfully at Sat Dec 1 01:35:09 GMT 2012

- GHC Test summary -

OVERALL SUMMARY for test run started at Fri Nov 30 21:40:11 GMT 2012
3402 total tests, which gave rise to
   16613 test cases, of which
  10 caused framework failures
3563 were skipped

   12537 expected passes
 367 had missing libraries
 131 expected failures
   0 unexpected passes
  15 unexpected failures

Unexpected failures:
   perf/compilerT6048 [stat not good enough] (optasm)
   perf/haddock haddock.Cabal [stat not good enough] (normal)
   perf/haddock haddock.base [stat not good enough] (normal)
   perf/haddock haddock.compiler [stat not good enough] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly01 [exit code non-0] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly02 [exit code non-0] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly03 [stderr mismatch] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly04 [exit code non-0] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly05 [stderr mismatch] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly06 [exit code non-0] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly07 [stderr mismatch] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly08 [stderr mismatch] (normal)
   safeHaskell/check/pkg01  ImpSafeOnly09 

[nightly] 30-Nov-2012 build of HEAD on x86_64-unknown-linux (cam-04-unx)

2012-11-30 Thread GHC Build Reports
Build description = HEAD on x86_64-unknown-linux (cam-04-unx)
Build location= /64playpen/simonmar/nightly/HEAD-cam-04-unx
Build config file = /home/simonmar/nightly/site/msrc/conf-HEAD-cam-04-unx

Nightly build started on cam-04-unx at Fri Nov 30 18:00:01 GMT 2012.
 checking out new source tree ... warning: libraries/binary 
already present; omitting
warning: libraries/bytestring already present; omitting
warning: libraries/Cabal already present; omitting
warning: libraries/containers already present; omitting
warning: libraries/haskeline already present; omitting
warning: libraries/pretty already present; omitting
warning: libraries/terminfo already present; omitting
warning: libraries/transformers already present; omitting
warning: libraries/Win32 already present; omitting
warning: libraries/xhtml already present; omitting
warning: libraries/primitive already present; omitting
warning: libraries/vector already present; omitting
Submodule 'libraries/Cabal' (http://darcs.haskell.org/libraries/Cabal.git/) 
registered for path 'libraries/Cabal'
Submodule 'libraries/Win32' (http://darcs.haskell.org/libraries/Win32.git/) 
registered for path 'libraries/Win32'
Submodule 'libraries/binary' (http://darcs.haskell.org/libraries/binary.git/) 
registered for path 'libraries/binary'
Submodule 'libraries/bytestring' 
(http://darcs.haskell.org/libraries/bytestring.git/) registered for path 
'libraries/bytestring'
Submodule 'libraries/containers' 
(http://darcs.haskell.org/libraries/containers.git/) registered for path 
'libraries/containers'
Submodule 'libraries/haskeline' 
(http://darcs.haskell.org/libraries/haskeline.git/) registered for path 
'libraries/haskeline'
Submodule 'libraries/pretty' (http://darcs.haskell.org/libraries/pretty.git/) 
registered for path 'libraries/pretty'
Submodule 'libraries/primitive' 
(http://darcs.haskell.org/libraries/primitive.git/) registered for path 
'libraries/primitive'
Submodule 'libraries/terminfo' 
(http://darcs.haskell.org/libraries/terminfo.git/) registered for path 
'libraries/terminfo'
Submodule 'libraries/transformers' 
(http://darcs.haskell.org/libraries/transformers.git/) registered for path 
'libraries/transformers'
Submodule 'libraries/vector' (http://darcs.haskell.org/libraries/vector.git/) 
registered for path 'libraries/vector'
Submodule 'libraries/xhtml' (http://darcs.haskell.org/libraries/xhtml.git/) 
registered for path 'libraries/xhtml'
Cloning into 'libraries/Cabal'...
Submodule path 'libraries/Cabal': checked out 
'532e349ec6ee33fc3477137b44f108d3658d0528'
Cloning into 'libraries/Win32'...
Submodule path 'libraries/Win32': checked out 
'21335a30161c099da79ae9619c9782e5e32e4644'
Cloning into 'libraries/binary'...
Submodule path 'libraries/binary': checked out 
'2d31cea238d0d08885c457475fc354dbf2b88976'
Cloning into 'libraries/bytestring'...
Submodule path 'libraries/bytestring': checked out 
'6bd69fe27af33e878e38f4c579983f6a23120a87'
Cloning into 'libraries/containers'...
Submodule path 'libraries/containers': checked out 
'a9b7224068ae60f73baacd5f76d2c27624d90120'
Cloning into 'libraries/haskeline'...
Submodule path 'libraries/haskeline': checked out 
'9ad00926f832f4e5f5d38c8fe84bfc85f4e8f728'
Cloning into 'libraries/pretty'...
Submodule path 'libraries/pretty': checked out 
'ab7e8d91470bb94c9e184dffbec89d0aae116f9b'
Cloning into 'libraries/primitive'...
Submodule path 'libraries/primitive': checked out 
'75c3379b6d76e914cc3c7ffd290b6b1cad7ea3e6'
Cloning into 'libraries/terminfo'...
Submodule path 'libraries/terminfo': checked out 
'579d2c324e69856ff8d1ea8b5036e30c920e1973'
Cloning into 'libraries/transformers'...
Submodule path 'libraries/transformers': checked out 
'a59fb93860f84ccd44178dcbbb82cfea7e02cd07'
Cloning into 'libraries/vector'...
Submodule path 'libraries/vector': checked out 
'c4c5a740ec977a4300449bc85f4707ec641be923'
Cloning into 'libraries/xhtml'...
Submodule path 'libraries/xhtml': checked out 
'fb9e0bbb69e15873682a9f25d39652099a3ccac1'
ok.
 Building stage 1 compiler... ok.
GHC Version 7.7.20121130
 Building stage 2 compiler... ok.
 Building stage 3 compiler... ok.
 building source distribution ... ok.
 uploading source distribution... ok.
 building testsuite tools ... ok.
 running tests... ok (summary below).
 building compiler binary distribution... ok.
 uploading binary distribution... ok.
 running nofib (-rtsopts -O2) ... ok.
 running nofib (-rtsopts -O2 -fllvm)  ... ok.
 running nofib (-rtsopts -O2 -prof -auto-all -static)... ok.
 running nofib (-rtsopts -O2 -prof -auto-all -fllvm -static)... ok.
 publishing logs  ... ok.
Logs  are at http://www.haskell.org/ghc/dist/current/logs
Dists are at http://www.haskell.org/ghc/dist/current/dist
Docs  

pgj (x86 FreeBSD HEAD), build 875, Success

2012-11-30 Thread Builder
pgj (x86 FreeBSD HEAD), build 875

Build succeeded
Details: http://darcs.haskell.org/ghcBuilder/builders/pgj/875.html

git clone| Success
create mk/build.mk   | Success
get subrepos | Success
repo versions| Success
touching clean-check files   | Success
setting version date | Success
booting  | Success
configuring  | Success
creating check-remove-before | Success
compiling| Success
creating check-remove-after  | Success
compiling testremove | Success
simulating clean | Success
checking clean   | Success
making bindist   | Success
publishing bindist   | Success
testing bindist  | Success
testing  | Success
testsuite summary| Success

Build succeeded
Details: http://darcs.haskell.org/ghcBuilder/builders/pgj/875.html

File not deleted:compiler/ghc.cabal.old
File not deleted:includes/dist-derivedconstants
File not deleted:includes/dist-derivedconstants/header
File not deleted:includes/dist-derivedconstants/header/DerivedConstants.h
File not deleted:
includes/dist-derivedconstants/header/GHCConstantsHaskellExports.hs
File not deleted:
includes/dist-derivedconstants/header/GHCConstantsHaskellType.hs
File not deleted:
includes/dist-derivedconstants/header/GHCConstantsHaskellWrappers.hs
File not deleted:includes/dist-derivedconstants/header/platformConstants
File not deleted:includes/dist-derivedconstants/header/tmp.c
File not deleted:includes/dist-derivedconstants/header/tmp.o
File not deleted:inplace
File not deleted:libraries/base/include/EventConfig.h
Deleted before file: libraries/time/include/HsTimeConfig.h
File not deleted:mk/config.mk.old
File not deleted:mk/project.mk.old
File not deleted:rts/libs.depend
File not deleted:rts/package.conf.inplace
File not deleted:rts/package.conf.inplace.raw

OVERALL SUMMARY for test run started at Sat Dec  1 04:21:24 UTC 2012
3504 total tests, which gave rise to
   11674 test cases, of which
   0 caused framework failures
8509 were skipped

2857 expected passes
  26 had missing libraries
  35 expected failures
  27 unexpected passes
 220 unexpected failures

Unexpected passes:
   ../../libraries/unix/tests  getEnvironment01 (normal)
   ../../libraries/unix/tests  getEnvironment02 (normal)
   ../../libraries/unix/tests  getGroupEntryForName (normal)
   ../../libraries/unix/tests  getUserEntryForName (normal)
   ../../libraries/unix/tests  queryfdoption01 (normal)
   codeGen/should_run  T7319 (prof)
   profiling/should_compile2410 (normal)
   profiling/should_compileprof001 (normal)
   profiling/should_compileprof002 (normal)
   profiling/should_run5314 (prof)
   profiling/should_runT2552 (prof)
   profiling/should_runT3001 (prof_hb)
   profiling/should_runT3001-2 (prof_hb)
   profiling/should_runT5363 (prof)
   profiling/should_runT5559 (prof)
   profiling/should_runT680 (prof)
   profiling/should_runT949 (prof)
   profiling/should_runcallstack001 (prof)
   profiling/should_runcallstack002 (prof)
   profiling/should_runheapprof001 (prof)
   profiling/should_runprof-doc-fib (prof)
   profiling/should_runprof-doc-last (prof)
   profiling/should_runprofinline001 (prof)
   profiling/should_runscc001 (prof)
   profiling/should_runscc002 (prof)
   profiling/should_runscc003 (prof)
   stranal/should_compile  newtype (optasm)

Unexpected failures:
   ../../libraries/base/tests/IO3307 [bad stderr] (normal)
   ../../libraries/base/tests/IOenvironment001 [bad stderr] (normal)
   ../../libraries/directory/tests  getPermissions001 [bad exit code] 
(normal)
   ../../libraries/hpc/tests/ghc_ghci   hpc_ghc_ghci [bad stderr] (normal)
   ../../libraries/process/testsprocess007 [bad stdout] (normal)
   ../../libraries/process/testsprocess009 [bad stdout] (normal)
   ../../libraries/unix/tests   fdReadBuf001 [bad exit code] (ghci)
   ../../libraries/unix/tests/libposix  posix005 [bad stdout] (normal)
   cabal1750 [bad stderr] (normal)
   cabalghcpkg01 [bad stderr] (normal)
   cabalghcpkg03 [bad stderr] (normal)
   cabalghcpkg05 [bad stderr] (normal)
   cabalghcpkg06 [bad stderr] (normal)
   cabalshadow [bad stderr] (normal)
   cabal/cabal01cabal01 [bad stderr] (normal)
   cabal/cabal04cabal04 [bad stderr] (normal)
   codeGen/should_compile   2578 [bad stderr] (normal)
   codeGen/should_run   cgrun068 [exit code