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

Old unexpected test passes:

    stableptr003  5  gabor head

New unexpected test failures:

    dynbrk007   2  gabor head
    hGetBuf001  1  x86-64 Linux head unreg
    print003    2  gabor head
    print006    2  gabor head

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:

                                     either_last rewrites in' (LastExit) = ...
                                     either_last rewrites in' (LastOther l) = 
...
                                     anal_f :: DFM a b -> a -> Graph m l -> DFM 
a b
                                     anal_f finish in' g = ...
                                     solve :: DFM a b -> a -> Graph m l -> Fuel 
-> DFM a (b, Fuel)
                                     solve_tail in' (ZTail m t) fuel = ...
                                     solve_tail in' (ZLast l) fuel = ...
                                     solve finish in_fact (Graph entry 
blockenv) fuel = ...
                                     fixed_point in_fact g fuel = ...
                                   in fixed_point

cmm/ZipDataflow.hs:371:43:
    Occurs check: cannot construct the infinite type: f = LastOutFacts f
      Expected type: DFM f f
      Inferred type: DFM f (LastOutFacts f)
    In the first argument of `solve', namely `lastOutFacts'
    In a case alternative:
        RewriteDeep -> solve lastOutFacts in' g (oneLessFuel fuel)

cmm/ZipDataflow.hs:497:64:
    Couldn't match the rigid variable `a' against `()'
      `a' is bound by the type signature for `forward_rew'
      Expected type: a
      Inferred type: ()
    In the first argument of `return', namely `()'
    In the first argument of `inner_rew', namely `(return ())'
<<ghc: 67609864 bytes, 16 GCs, 2318020/4641928 avg/max bytes residency (3 
samples), 18M in use, 0.00 INIT (0.00 elapsed), 0.31 MUT (0.65 elapsed), 0.18 
GC (0.18 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