Build #8 for colada-0.4.1

[all reports]

Package colada-0.4.1
Install DependencyFailed monad-atom-0.4.1
Docs NotTried
Tests NotTried
Time submitted 2016-12-25 06:47:33.326374 UTC
Compiler ghc-8.0.1.20161018
OS linux
Arch x86_64
Dependencies ListZipper-1.2.0.2, base-4.9.0.0, bytestring-0.10.8.1, cereal-0.5.4.0, cmdargs-0.10.14, containers-0.5.7.1, fclabels-2.0.3.2, ghc-prim-0.5.0.0, monad-atom-0.4.1, mtl-2.2.1, split-0.2.3.1, swift-lda-0.4.1, text-1.2.2.1, vector-0.11.0.0, ListZipper-1.2.0.2, base-4.9.0.0, bytestring-0.10.8.1, cereal-0.5.4.0, cmdargs-0.10.14, containers-0.5.7.1, fclabels-2.0.3.2, ghc-prim-0.5.0.0, monad-atom-0.4.1, mtl-2.2.1, split-0.2.3.1, swift-lda-0.4.1, text-1.2.2.1, vector-0.11.0.0
Flags none

Code Coverage

No Code Coverage was submitted for this report.

Build log

[view raw]

Resolving dependencies...
Configuring cereal-0.5.4.0...
Configuring cmdargs-0.10.14...
Building cereal-0.5.4.0...
Building cmdargs-0.10.14...
Configuring primitive-0.6.1.0...
Installed cereal-0.5.4.0
Building primitive-0.6.1.0...
Configuring mtl-2.2.1...
Installed primitive-0.6.1.0
Building mtl-2.2.1...
Configuring random-1.1...
Installed mtl-2.2.1
Building random-1.1...
Configuring split-0.2.3.1...
Installed cmdargs-0.10.14
Configuring text-1.2.2.1...
Installed random-1.1
Building split-0.2.3.1...
Building text-1.2.2.1...
Installed split-0.2.3.1
Configuring fclabels-2.0.3.2...
Building fclabels-2.0.3.2...
Configuring vector-0.11.0.0...
Installed fclabels-2.0.3.2
Building vector-0.11.0.0...
Configuring monad-atom-0.4.1...
Installed text-1.2.2.1
Building monad-atom-0.4.1...
Configuring tf-random-0.5...
Failed to install monad-atom-0.4.1
Build log ( /home/builder/.cabal/logs/monad-atom-0.4.1.log ):
cabal: Entering directory '/tmp/cabal-tmp-18352/monad-atom-0.4.1'
Configuring monad-atom-0.4.1...
Building monad-atom-0.4.1...
Preprocessing library monad-atom-0.4.1...
[1 of 1] Compiling Control.Monad.Atom ( Control/Monad/Atom.hs, dist/build/Control/Monad/Atom.o )

Control/Monad/Atom.hs:52:23: error:
    • No instance for (Applicative (AtomT a m))
        arising from the 'deriving' clause of a data type declaration
      Possible fix:
        use a standalone 'deriving instance' declaration,
          so you can specify the instance context yourself
    • When deriving the instance for (Monad (AtomT a m))

Control/Monad/Atom.hs:56:23: error:
    • No instance for (Applicative (Atom a))
        arising from the 'deriving' clause of a data type declaration
      Possible fix:
        use a standalone 'deriving instance' declaration,
          so you can specify the instance context yourself
    • When deriving the instance for (Monad (Atom a))
cabal: Leaving directory '/tmp/cabal-tmp-18352/monad-atom-0.4.1'
Building tf-random-0.5...
Installed tf-random-0.5
Configuring QuickCheck-2.9.2...
Building QuickCheck-2.9.2...
Installed vector-0.11.0.0
Configuring mwc-random-0.13.5.0...
Building mwc-random-0.13.5.0...
Installed QuickCheck-2.9.2
Configuring ListZipper-1.2.0.2...
Building ListZipper-1.2.0.2...
Installed mwc-random-0.13.5.0
Configuring swift-lda-0.4.1...
Installed ListZipper-1.2.0.2
Building swift-lda-0.4.1...
Failed to install swift-lda-0.4.1
Build log ( /home/builder/.cabal/logs/swift-lda-0.4.1.log ):
cabal: Entering directory '/tmp/cabal-tmp-18349/swift-lda-0.4.1'
Configuring swift-lda-0.4.1...
Building swift-lda-0.4.1...
Preprocessing library swift-lda-0.4.1...
[1 of 2] Compiling NLP.SwiftLDA.UnboxedMaybeVector ( NLP/SwiftLDA/UnboxedMaybeVector.hs, dist/build/NLP/SwiftLDA/UnboxedMaybeVector.o )

NLP/SwiftLDA/UnboxedMaybeVector.hs:22:10: warning: [-Wmissing-methods]
    • No explicit implementation for
        ‘M.basicInitialize’
    • In the instance declaration for ‘M.MVector MVector (Maybe a)’
[2 of 2] Compiling NLP.SwiftLDA     ( NLP/SwiftLDA.hs, dist/build/NLP/SwiftLDA.o )

NLP/SwiftLDA.hs:299:7: error:
    • Non type-variable argument
        in the constraint: MArray (STUArray s) Double m
      (Use FlexibleContexts to permit this)
    • When checking the inferred type
        copy :: forall (m :: * -> *).
                (MArray (STUArray s) Double m, MArray a0 Double m) =>
                (Int, Int) -> m ()
      In the expression:
        do { bs@((l1, l2), (u1_old, u2)) <- getBounds a;
             trace (show bs) () `seq` return ();
             let u1 = u1_old * 2
                 bs' = ...;
             b <- newArray bs' 0;
             .... }
      In an equation for ‘resize’:
          resize a
            = do { bs@((l1, l2), (u1_old, u2)) <- getBounds a;
                   trace (show bs) () `seq` return ();
                   let u1 = ...
                       ....;
                   .... }

NLP/SwiftLDA.hs:317:7: error:
    • Non type-variable argument
        in the constraint: MArray (STUArray s) Double m
      (Use FlexibleContexts to permit this)
    • When checking the inferred type
        go :: forall (m :: * -> *).
              MArray (STUArray s) Double m =>
              Int -> Double -> m Int
      In the expression:
        do { (l, u) <- getBounds ws;
             let go !i !_n | i > u = return (i - 1)
                 go !i !n
                   | n > 0.0 = ...
                   | otherwise = return (i - 1);
             go l r }
      In an equation for ‘findEvent’:
          findEvent !r ws
            = do { (l, u) <- getBounds ws;
                   let go !i !_n | i > u = ...
                       go !i !n
                         | n > 0.0 = ...
                         | otherwise = ...;
                   go l r }

NLP/SwiftLDA.hs:358:9: error:
    • Non type-variable argument
        in the constraint: MArray (STUArray s) Double m
      (Use FlexibleContexts to permit this)
    • When checking the inferred type
        f :: forall (m :: * -> *).
             MArray (STUArray s) Double m =>
             Table2D -> (Int, Int) -> m Table2D
      In an equation for ‘freezeArray2D’:
          freezeArray2D a
            = do { bs <- getBounds a;
                   Fold.foldlM f IntMap.empty (range bs) }
            where
                f z ind@(!i, !i')
                  = do { !v <- readArray a ind;
                         .... }
cabal: Leaving directory '/tmp/cabal-tmp-18349/swift-lda-0.4.1'
cabal: Error: some packages failed to install:
colada-0.4.1 depends on monad-atom-0.4.1 which failed to install.
monad-atom-0.4.1 failed during the building phase. The exception was:
ExitFailure 1
swift-lda-0.4.1 failed during the building phase. The exception was:
ExitFailure 1

Test log

No test log was submitted for this report.