Build results:
x86-64 Linux head:       fail (failed stage1)
gabor head:              pass
tnaur x86 Linux head:    fail (failed stage1)
x86-64 Linux head unreg: lost

Old unexpected test passes:

    stableptr003  5  gabor head

Fixed unexpected test failures:

    getEnv001

Old unexpected test failures:

    1679                1  x86-64 Linux head unreg
    TH_spliceE5_prof    1  x86-64 Linux head unreg
    arr003              1  x86-64 Linux head unreg
    arr004              1  x86-64 Linux head unreg
    arr007              1  x86-64 Linux head unreg
    arr008              1  x86-64 Linux head unreg
    barton-mangler-bug  1  x86-64 Linux head unreg
    cg015               1  x86-64 Linux head unreg
    cg016               1  x86-64 Linux head unreg
    cg035               1  x86-64 Linux head unreg
    cg045               1  x86-64 Linux head unreg
    cg051               1  x86-64 Linux head unreg
    cg059               1  x86-64 Linux head unreg
    cg060               1  x86-64 Linux head unreg
    conc009             1  x86-64 Linux head unreg
    conc020             1  x86-64 Linux head unreg
    conc021             1  x86-64 Linux head unreg
    conc022             1  x86-64 Linux head unreg
    conc040             1  x86-64 Linux head unreg
    conc058             1  x86-64 Linux head unreg
    conc064             2  gabor head
    conc068             1  x86-64 Linux head unreg
    concprog001         1  tnaur x86 Linux head
    divbyzero           2  macgyver PPC OSX head
    dsrun005            1  x86-64 Linux head unreg
    dsrun007            1  x86-64 Linux head unreg
    dsrun008            1  x86-64 Linux head unreg
    dsrun014            1  x86-64 Linux head unreg
    fed001              1  x86-64 Linux head unreg
    ffi003              2  macgyver PPC OSX head
    ffi004              1  x86-64 Linux head unreg
    ffi006              1  x86-64 Linux head unreg
    ffi008              1  x86-64 Linux head unreg
    ffi009              3  macgyver PPC OSX head
    ffi010              1  x86-64 Linux head unreg
    ffi011              1  x86-64 Linux head unreg
    ffi013              1  x86-64 Linux head unreg
    ffi018              1  x86-64 Linux head unreg
    ffi019              1  x86-64 Linux head unreg
    ghc-e005            1  x86-64 Linux head unreg
    ghci024             2  macgyver PPC OSX head
    hpc_raytrace        5  gabor head
    num012              2  macgyver PPC OSX head
    openFile002         1  x86-64 Linux head unreg
    qq005               5  gabor head
    qq006               5  gabor head
    records             5  gabor head
    signals002          2  macgyver PPC OSX head
    simplrun010         1  x86-64 Linux head unreg
    strun002            1  x86-64 Linux head unreg
    trace001            1  x86-64 Linux head unreg
    ubx-records         5  gabor head
Last 30 lines:

      []
      getApStackVal#_awe =
        \ (a1_avZ :: a_awc) (a2_aw1 :: GHC.Prim.Int#) ->
          letrec {
            $sat_s3fE :: (# GHC.Prim.Int#, b_awd #)
            []
            $sat_s3fE =
              let {
                sat_awe :: a_awc -> GHC.Prim.Int# -> (# GHC.Prim.Int#, b_awd #)
                []
                sat_awe = \ (a1_avZ :: a_awc) (a2_aw1 :: GHC.Prim.Int#) -> 
$sat_s3fE } in
              GHC.Prim.getApStackVal# @ a_awc @ b_awd a1_avZ a2_aw1; } in
          $sat_s3fE } in
    getApStackVal#_awe
end Rec }

*** End of Offense ***


<no location info>: 
Compilation had errors


make[3]: *** [dist/build/GHC/PrimopWrappers.o] Error 1
make[3]: Leaving directory 
`/64playpen/buildbot/x86_64-linux-head/build/libraries/ghc-prim'
make[2]: *** [make.library.ghc-prim] Error 2
make[2]: Leaving directory 
`/64playpen/buildbot/x86_64-linux-head/build/libraries'
make[1]: *** [stage1] Error 2
make[1]: Leaving directory `/64playpen/buildbot/x86_64-linux-head/build'
Last 30 lines:


cmm/ZipDataflow.hs:653:0:
    Contexts differ in length
    When matching the contexts of the signatures for
      backward_sol :: forall m l (g :: * -> * -> *) a.
                      (DebugNodes m l, LastNode l, Outputable a) =>
                      (forall a. Fuel -> Maybe a -> Maybe a)
                      -> (g m l -> DFM a (Graph m l))
                      -> RewritingDepth
                      -> PassName
                      -> BlockEnv a
                      -> BackwardTransfers m l a
                      -> BackwardRewrites m l a g
                      -> Graph m l
                      -> a
                      -> Fuel
                      -> DFM a (CommonFixedPoint m l a (), Fuel)
      bwd_pure_anal :: forall m l a.
                       (DebugNodes m l, Outputable a) =>
                       PassName
                       -> BlockEnv a
                       -> BackwardTransfers m l a
                       -> Graph m l
                       -> a
                       -> DFM a (CommonFixedPoint m l a ())
    The signature contexts in a mutually recursive group should all be identical
<<ghc: 71502292 bytes, 17 GCs, 2318020/4641928 avg/max bytes residency (3 
samples), 18M in use, 0.00 INIT (0.00 elapsed), 0.32 MUT (0.58 elapsed), 0.20 
GC (0.19 elapsed) :ghc>>
make[1]: *** [stage1/cmm/ZipDataflow.o] Error 1
make: *** [stage1] Error 1
_______________________________________________
Cvs-ghc mailing list
Cvs-ghc@haskell.org
http://www.haskell.org/mailman/listinfo/cvs-ghc

Reply via email to