Build #3 for funcons-tools-0.2.0.7

[all reports]

Package funcons-tools-0.2.0.7
Install BuildFailed
Docs NotTried
Tests NotTried
Time submitted 2018-12-14 10:43:32.409867415 UTC
Compiler ghc-8.6.1
OS linux
Arch x86_64
Dependencies TypeCompose-0.9.14, base-4.12.0.0, bv-0.5, containers-0.5.11.0, directory-1.3.3.0, funcons-values-0.1.0.5, gll-0.4.0.12, mtl-2.2.2, multiset-0.3.4.1, random-strings-0.1.1.0, regex-applicative-0.3.3, split-0.2.3.3, text-1.2.3.1, vector-0.12.0.2, TypeCompose-0.9.14, base-4.12.0.0, bv-0.5, containers-0.5.11.0, directory-1.3.3.0, funcons-values-0.1.0.5, gll-0.4.0.12, mtl-2.2.2, multiset-0.3.4.1, random-strings-0.1.1.0, regex-applicative-0.3.3, split-0.2.3.3, text-1.2.3.1, vector-0.12.0.2
Flags none

Code Coverage

No Code Coverage was submitted for this report.

Build log

[view raw]

Warning: The install command is a part of the legacy v1 style of cabal usage.

Please switch to using either the new project style and the new-install
command or the legacy v1-install alias as new-style projects will become the
default in the next version of cabal-install. Please file a bug if you cannot
replicate a working v1- use case with the new-style commands.

For more information, see: https://wiki.haskell.org/Cabal/NewBuild

Resolving dependencies...
Warning: The following packages are likely to be broken by the reinstalls:
parsec-3.1.13.0
Cabal-2.4.0.1
libiserv-8.6.1
ghci-8.6.1
ghc-8.6.1
ghc-boot-8.6.1
Continuing even though the plan contains dangerous reinstalls.
Starting     base-orphans-0.8
Starting     bv-0.5
Building     bv-0.5
Building     base-orphans-0.8
Completed    base-orphans-0.8
Starting     containers-0.5.11.0
Building     containers-0.5.11.0
Completed    bv-0.5
Starting     primitive-0.6.4.0
Building     primitive-0.6.4.0
Completed    primitive-0.6.4.0
Starting     random-1.1
Building     random-1.1
Completed    random-1.1
Starting     split-0.2.3.3
Building     split-0.2.3.3
Completed    split-0.2.3.3
Starting     TypeCompose-0.9.14
Building     TypeCompose-0.9.14
Completed    TypeCompose-0.9.14
Starting     vector-0.12.0.2
Building     vector-0.12.0.2
Completed    containers-0.5.11.0
Starting     random-strings-0.1.1.0
Building     random-strings-0.1.1.0
Completed    random-strings-0.1.1.0
Starting     regex-applicative-0.3.3
Building     regex-applicative-0.3.3
Completed    regex-applicative-0.3.3
Starting     multiset-0.3.4.1
Building     multiset-0.3.4.1
Completed    multiset-0.3.4.1
Starting     binary-0.8.6.0
Building     binary-0.8.6.0
Completed    binary-0.8.6.0
Starting     text-1.2.3.1
Building     text-1.2.3.1
Completed    vector-0.12.0.2
Completed    text-1.2.3.1
Starting     funcons-values-0.1.0.5
Starting     gll-0.4.0.12
Building     gll-0.4.0.12
Building     funcons-values-0.1.0.5
Completed    funcons-values-0.1.0.5
Completed    gll-0.4.0.12
Starting     funcons-tools-0.2.0.7
Building     funcons-tools-0.2.0.7
Failed to install funcons-tools-0.2.0.7
Build log ( /home/builder/.cabal/logs/ghc-8.6.1/funcons-tools-0.2.0.7-Emj6otxSHpf6tTxphykuxX.log ):
cabal: Entering directory '/tmp/cabal-tmp-17794/funcons-tools-0.2.0.7'
Configuring funcons-tools-0.2.0.7...
Preprocessing library for funcons-tools-0.2.0.7..
Building library for funcons-tools-0.2.0.7..
[ 1 of 74] Compiling Funcons.Types    ( src/Funcons/Types.hs, dist/build/Funcons/Types.o )

src/Funcons/Types.hs:10:1: warning: [-Wunused-imports]
    The qualified import of ‘Data.Char’ is redundant
      except perhaps to import instances from ‘Data.Char’
    To import instances alone, use: import Data.Char()
   |
10 | import qualified Data.Char as C
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^

src/Funcons/Types.hs:13:1: warning: [-Wunused-imports]
    The qualified import of ‘Data.MultiSet’ is redundant
      except perhaps to import instances from ‘Data.MultiSet’
    To import instances alone, use: import Data.MultiSet()
   |
13 | import qualified Data.MultiSet as MS
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^

src/Funcons/Types.hs:16:1: warning: [-Wunused-imports]
    The import of ‘Data.Ratio’ is redundant
      except perhaps to import instances from ‘Data.Ratio’
    To import instances alone, use: import Data.Ratio()
   |
16 | import Data.Ratio
   | ^^^^^^^^^^^^^^^^^
[ 2 of 74] Compiling Funcons.GLLParser ( src/Funcons/GLLParser.hs, dist/build/Funcons/GLLParser.o )

src/Funcons/GLLParser.hs:44:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘Funcons.GLLParser.lexer’
      Consider giving it a type signature
   |
44 | lexer = GLL.Combinators.lexer fct_lexerSettings
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^

src/Funcons/GLLParser.hs:46:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘fct_keywords’
      Consider giving it a type signature
   |
46 | fct_keywords = ["void", "depends", "forall", "type_abs"
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^...

src/Funcons/GLLParser.hs:48:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘fct_keychars’
      Consider giving it a type signature
   |
48 | fct_keychars = "{}(),'\"[]|^&~"
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^

src/Funcons/GLLParser.hs:94:9: warning: [-Wmonomorphism-restriction]
    • The Monomorphism Restriction applies to the binding for ‘merge’
        Consider giving it a type signature
    • In an equation for ‘pFunconss’:
          pFunconss
            = "FUNCONS-SEQUENCE"
                <::=
                  Left <$$> pFuncons
                    <||>
                      Right . merge <$$> parens (multipleSepBy pFunconss (keychar ','))
            where
                merge
                  = foldr op []
                  where
                      op (Left f) acc = f : acc
                      op (Right fs) acc = fs ++ acc
   |
94 |   where merge = foldr op [] 
   |         ^^^^^^^^^^^^^^^^^^^^...

src/Funcons/GLLParser.hs:119:9: warning: [-Wmonomorphism-restriction]
    • The Monomorphism Restriction applies to the binding
      for ‘pRatioAsString’
        Consider giving it a type signature
    • In an equation for ‘pValues’:
          pValues
            = "VALUES"
                <:=>
                  Char <$$> char_lit
                    <||>
                      string__ <$$> string_lit
                        <||>
                          mk_integers . toInteger <$$> int_lit
                            <||> IEEE_Float_64 . fst . head . readFloat <$$> pRatioAsString
            where
                pRatioAsString
                  = "RATIOasSTRING"
                      <:=>
                        (\ m l -> show m ++ "." ++ show l) <$$> int_lit <** keychar '.'
                          <**> int_lit
    |
119 |  where  pRatioAsString = "RATIOasSTRING" -- NOT OK, would parse "-2.-3"
    |         ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^...
[ 3 of 74] Compiling Funcons.Parser   ( src/Funcons/Parser.hs, dist/build/Funcons/Parser.o )
[ 4 of 74] Compiling Funcons.RunOptions ( src/Funcons/RunOptions.hs, dist/build/Funcons/RunOptions.o )

src/Funcons/RunOptions.hs:125:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘booleanOptions’
      Consider giving it a type signature
    |
125 | booleanOptions = 
    | ^^^^^^^^^^^^^^^^^...

src/Funcons/RunOptions.hs:132:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘stringOptions’
      Consider giving it a type signature
    |
132 | stringOptions = ["display-mutable-entity", "hide-output-entity"
    | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^...

src/Funcons/RunOptions.hs:199:1: warning: [-Wmonomorphism-restriction]
    The Monomorphism Restriction applies to the binding
    for ‘cfg_keychars’
      Consider giving it a type signature
    |
199 | cfg_keychars = ":;="
    | ^^^^^^^^^^^^^^^^^^^^

src/Funcons/RunOptions.hs:243:11: warning: [-Wmonomorphism-restriction]
    • The Monomorphism Restriction applies to the binding for ‘pResult’
        Consider giving it a type signature
    • In an equation for ‘pTestOutcomes’:
          pTestOutcomes
            = "TEST-OUTCOMES"
                <:=> toOptions <$$> (M.union <$$> pResult <**> pEntityValues)
            where
                pResult
                  = mStoreResult
                      <$$>
                        optional
                          (id <$$ keyword "result-term" <** keychar ':' <**> pFunconsSeq
                             <** keychar ';')
                  where
                      mStoreResult Nothing = M.empty
                      mStoreResult (Just f) = M.singleton "result-term" f
                pEntityValues
                  = "TEST-ENTITIES"
                      <:=>
                        M.fromList
                          <$$>
                            multiple
                              ((,) . pack <$$> pFunconName <** keychar ':' <**> pFunconsSeq
                                 <** keychar ';')
                toOptions map = defaultRunOptions {expected_outcomes = map}
    |
243 |     where pResult = mStoreResult <$$>
    |           ^^^^^^^^^^^^^^^^^^^^^^^^^^^...
[ 5 of 74] Compiling Funcons.Printer  ( src/Funcons/Printer.hs, dist/build/Funcons/Printer.o )
[ 6 of 74] Compiling Funcons.Exceptions ( src/Funcons/Exceptions.hs, dist/build/Funcons/Exceptions.o )
[ 7 of 74] Compiling Funcons.Simulation ( src/Funcons/Simulation.hs, dist/build/Funcons/Simulation.o )

src/Funcons/Simulation.hs:6:1: warning: [-Wunused-imports]
    The import of ‘Funcons.Exceptions’ is redundant
      except perhaps to import instances from ‘Funcons.Exceptions’
    To import instances alone, use: import Funcons.Exceptions()
  |
6 | import Funcons.Exceptions
  | ^^^^^^^^^^^^^^^^^^^^^^^^^

src/Funcons/Simulation.hs:11:1: warning: [-Wunused-imports]
    The import of ‘Control.Applicative’ is redundant
      except perhaps to import instances from ‘Control.Applicative’
    To import instances alone, use: import Control.Applicative()
   |
11 | import Control.Applicative
   | ^^^^^^^^^^^^^^^^^^^^^^^^^^
[ 8 of 74] Compiling Funcons.MSOS     ( src/Funcons/MSOS.hs, dist/build/Funcons/MSOS.o )

src/Funcons/MSOS.hs:211:52: error:
    • No instance for (Semigroup RewriteWriterr)
        arising from a use of ‘<>’
    • In the expression: cs1 <> cs2
      In the expression: (a2, st2, cs1 <> cs2)
      In the expression:
        let
          (Rewrite h) = k a1
          (a2, st2, cs2) = h ctxt st1
        in (a2, st2, cs1 <> cs2)
    |
211 |                                         in (a2,st2,cs1 <> cs2))
    |                                                    ^^^^^^^^^^

src/Funcons/MSOS.hs:213:10: error:
    • No instance for (Semigroup RewriteWriterr)
        arising from the superclasses of an instance declaration
    • In the instance declaration for ‘Monoid RewriteWriterr’
    |
213 | instance Monoid RewriteWriterr where
    |          ^^^^^^^^^^^^^^^^^^^^^

src/Funcons/MSOS.hs:316:45: error:
    • Could not deduce (Semigroup MSOSWriter)
        arising from a use of ‘<>’
      from the context: Interactive m
        bound by a type expected by the context:
                   forall (m :: * -> *).
                   Interactive m =>
                   MSOSReader m
                   -> MSOSState m -> m (Either IException b, MSOSState m, MSOSWriter)
        at src/Funcons/MSOS.hs:(309,20)-(316,56)
    • In the expression: wr1 <> wr2
      In the first argument of ‘return’, namely ‘(a2, mut2, wr1 <> wr2)’
      In a stmt of a 'do' block: return (a2, mut2, wr1 <> wr2)
    |
316 |                             return (a2,mut2,wr1 <> wr2))
    |                                             ^^^^^^^^^^

src/Funcons/MSOS.hs:318:10: error:
    • No instance for (Semigroup MSOSWriter)
        arising from the superclasses of an instance declaration
    • In the instance declaration for ‘Monoid MSOSWriter’
    |
318 | instance Monoid MSOSWriter where
    |          ^^^^^^^^^^^^^^^^^

src/Funcons/MSOS.hs:444:10: error:
    • No instance for (Semigroup Counters)
        arising from the superclasses of an instance declaration
    • In the instance declaration for ‘Monoid Counters’
    |
444 | instance Monoid Counters where
    |          ^^^^^^^^^^^^^^^

src/Funcons/MSOS.hs:585:41: error:
    • Could not deduce (Semigroup MSOSWriter)
        arising from a use of ‘<>’
      from the context: Interactive m
        bound by a type expected by the context:
                   forall (m :: * -> *).
                   Interactive m =>
                   MSOSReader m
                   -> MSOSState m
                   -> m (Either IException StepRes, MSOSState m, MSOSWriter)
        at src/Funcons/MSOS.hs:(578,55)-(586,39)
    • In the expression: wr' <> wr''
      In the first argument of ‘return’, namely
        ‘(e_f'', mut'', wr' <> wr'')’
      In a stmt of a 'do' block: return (e_f'', mut'', wr' <> wr'')
    |
585 |                   return (e_f'', mut'', wr' <> wr'')
    |                                         ^^^^^^^^^^^

src/Funcons/MSOS.hs:602:41: error:
    • Could not deduce (Semigroup MSOSWriter)
        arising from a use of ‘<>’
      from the context: Interactive m
        bound by a type expected by the context:
                   forall (m :: * -> *).
                   Interactive m =>
                   MSOSReader m
                   -> MSOSState m
                   -> m (Either IException StepRes, MSOSState m, MSOSWriter)
        at src/Funcons/MSOS.hs:(592,49)-(603,39)
    • In the expression: wr' <> wr''
      In the first argument of ‘return’, namely
        ‘(e_f'', mut'', wr' <> wr'')’
      In a stmt of a 'do' block: return (e_f'', mut'', wr' <> wr'')
    |
602 |                   return (e_f'', mut'', wr' <> wr'')
    |                                         ^^^^^^^^^^^
cabal: Leaving directory '/tmp/cabal-tmp-17794/funcons-tools-0.2.0.7'
cabal: Error: some packages failed to install:
funcons-tools-0.2.0.7-Emj6otxSHpf6tTxphykuxX failed during the building phase.
The exception was:
ExitFailure 1

Test log

No test log was submitted for this report.