Build #1 for ghc-typelits-extra-0.4.6

[all reports]

Package ghc-typelits-extra-0.4.6
Install InstallOk
Docs Ok
Tests Ok
Time submitted 2023-10-10 17:47:31.800687392 UTC
Compiler ghc-9.2.4
OS linux
Arch x86_64
Dependencies base-4.16.3.0, containers-0.6.5.1, ghc-9.2.4, ghc-bignum-1.2, ghc-prim-0.8.0, ghc-tcplugins-extra-0.4.5, ghc-typelits-knownnat-0.7.9, ghc-typelits-natnormalise-0.7.9, transformers-0.5.6.2
Flags -deverror

Code Coverage

expressions68% (49/72)
booleanguards50% (1/2)
conditions 100% (0/0)
qualifiers100% (0/0)
alternatives100% (3/3)
local declarations100% (4/4)
top-level declarations75% (6/8)

Build log

[view raw]

Resolving dependencies...
Starting     ghc-tcplugins-extra-0.4.5
Building     ghc-tcplugins-extra-0.4.5
Completed    ghc-tcplugins-extra-0.4.5
Starting     ghc-typelits-natnormalise-0.7.9
Building     ghc-typelits-natnormalise-0.7.9
Completed    ghc-typelits-natnormalise-0.7.9
Starting     ghc-typelits-knownnat-0.7.9
Building     ghc-typelits-knownnat-0.7.9
Completed    ghc-typelits-knownnat-0.7.9
Downloading  ghc-typelits-extra-0.4.6
Downloaded   ghc-typelits-extra-0.4.6
Starting     ghc-typelits-extra-0.4.6
Building     ghc-typelits-extra-0.4.6
Completed    ghc-typelits-extra-0.4.6

Test log

[view raw]

Resolving dependencies...
Build profile: -w ghc-9.2.4 -O0
In order, the following will be built (use -v for more details):
 - ghc-typelits-knownnat-0.7.9 (lib:ghc-typelits-knownnat) (requires build)
 - ghc-typelits-extra-0.4.6 (first run)
Starting     ghc-typelits-knownnat-0.7.9 (all, legacy fallback)
Building     ghc-typelits-knownnat-0.7.9 (all, legacy fallback)
Installing   ghc-typelits-knownnat-0.7.9 (all, legacy fallback)
Completed    ghc-typelits-knownnat-0.7.9 (all, legacy fallback)
Configuring ghc-typelits-extra-0.4.6...
Preprocessing library for ghc-typelits-extra-0.4.6..
Building library for ghc-typelits-extra-0.4.6..
[1 of 4] Compiling GHC.TypeLits.Extra ( src/GHC/TypeLits/Extra.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra.dyn_o )
[2 of 4] Compiling GHC.TypeLits.Extra.Solver.Operations ( src/GHC/TypeLits/Extra/Solver/Operations.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver/Operations.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver/Operations.dyn_o )
[3 of 4] Compiling GHC.TypeLits.Extra.Solver.Unify ( src/GHC/TypeLits/Extra/Solver/Unify.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver/Unify.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver/Unify.dyn_o )
[4 of 4] Compiling GHC.TypeLits.Extra.Solver ( src-pre-ghc-9.4/GHC/TypeLits/Extra/Solver.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/GHC/TypeLits/Extra/Solver.dyn_o )
Preprocessing test suite 'test-ghc-typelits-extra' for ghc-typelits-extra-0.4.6..
Building test suite 'test-ghc-typelits-extra' for ghc-typelits-extra-0.4.6..
[1 of 2] Compiling ErrorTests       ( tests-pre-ghc-9.4/ErrorTests.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/test-ghc-typelits-extra/test-ghc-typelits-extra-tmp/ErrorTests.o )

tests-pre-ghc-9.4/ErrorTests.hs:1:1: warning: [-Wdeferred-type-errors]
    Couldn't match type Data.Type.Ord.OrdCond
                           (CmpNat (n + 2) (n + 1)) 'True 'True 'False
                   with 'True
    Expected: Proxy ((n + 2) <=? Max (n + 1) 1) -> Proxy 'True
      Actual: Proxy 'True -> Proxy 'True
  |
1 | {-# LANGUAGE CPP, DataKinds, TypeOperators, TypeApplications, TypeFamilies #-}
  | ^

tests-pre-ghc-9.4/ErrorTests.hs:1:1: warning: [-Wdeferred-type-errors]
    Couldn't match type: 24 + x
                   with: x + 18
    Expected: Proxy (LCM 6 8 + x) -> Proxy (x + LCM 6 9)
      Actual: Proxy (LCM 6 8 + x) -> Proxy (LCM 6 8 + x)
    NB: + is a non-injective type family
  |
1 | {-# LANGUAGE CPP, DataKinds, TypeOperators, TypeApplications, TypeFamilies #-}
  | ^

tests-pre-ghc-9.4/ErrorTests.hs:1:1: warning: [-Wdeferred-type-errors]
    Couldn't match type: 3 + x
                   with: x + 4
    Expected: Proxy (CLog 3 10 + x) -> Proxy (x + CLog 2 9)
      Actual: Proxy (CLog 3 10 + x) -> Proxy (CLog 3 10 + x)
    NB: + is a non-injective type family
  |
1 | {-# LANGUAGE CPP, DataKinds, TypeOperators, TypeApplications, TypeFamilies #-}
  | ^

tests-pre-ghc-9.4/ErrorTests.hs:1:1: warning: [-Wdeferred-type-errors]
    Couldn't match type: 2 + x
                   with: x + 3
    Expected: Proxy (GCD 6 8 + x) -> Proxy (x + GCD 6 9)
      Actual: Proxy (GCD 6 8 + x) -> Proxy (GCD 6 8 + x)
    NB: + is a non-injective type family
  |
1 | {-# LANGUAGE CPP, DataKinds, TypeOperators, TypeApplications, TypeFamilies #-}
  | ^

tests-pre-ghc-9.4/ErrorTests.hs:17:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type GCD 6 8 with 4
      Expected: Proxy (GCD 6 8) -> Proxy 4
        Actual: Proxy 4 -> Proxy 4
    " In the expression: id
      In an equation for testFail1: testFail1 = id
   |
17 | testFail1 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:23:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type CLog 3 10 with 2
      Expected: Proxy (CLog 3 10) -> Proxy 2
        Actual: Proxy 2 -> Proxy 2
    " In the expression: id
      In an equation for testFail3: testFail3 = id
   |
23 | testFail3 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:29:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type CLog 0 4 with 100
      Expected: Proxy (CLog 0 4) -> Proxy 100
        Actual: Proxy 100 -> Proxy 100
    " In the expression: id
      In an equation for testFail5: testFail5 = id
   |
29 | testFail5 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:32:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type CLog 1 4 with 100
      Expected: Proxy (CLog 1 4) -> Proxy 100
        Actual: Proxy 100 -> Proxy 100
    " In the expression: id
      In an equation for testFail6: testFail6 = id
   |
32 | testFail6 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:35:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type CLog 4 0 with 0
      Expected: Proxy (CLog 4 0) -> Proxy 0
        Actual: Proxy 0 -> Proxy 0
    " In the expression: id
      In an equation for testFail7: testFail7 = id
   |
35 | testFail7 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:38:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type y with CLog 1 1
      Expected: Proxy (CLog 1 (1 ^ y)) -> Proxy y
        Actual: Proxy y -> Proxy y
      y is a rigid type variable bound by
        the type signature for:
          testFail8 :: forall (y :: Natural).
                       Proxy (CLog 1 (1 ^ y)) -> Proxy y
        at tests-pre-ghc-9.4/ErrorTests.hs:37:1-44
    " In the expression: id
      In an equation for testFail8: testFail8 = id
    " Relevant bindings include
        testFail8 :: Proxy (CLog 1 (1 ^ y)) -> Proxy y
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:38:1)
   |
38 | testFail8 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:41:13: warning: [-Wdeferred-type-errors]
    " Couldn't match type y with CLog 0 (0 ^ y)
      Expected: Proxy (CLog 0 (0 ^ y)) -> Proxy y
        Actual: Proxy y -> Proxy y
      y is a rigid type variable bound by
        the type signature for:
          testFail9 :: forall (y :: Natural).
                       Proxy (CLog 0 (0 ^ y)) -> Proxy y
        at tests-pre-ghc-9.4/ErrorTests.hs:40:1-44
    " In the expression: id
      In an equation for testFail9: testFail9 = id
    " Relevant bindings include
        testFail9 :: Proxy (CLog 0 (0 ^ y)) -> Proxy y
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:41:1)
   |
41 | testFail9 = id
   |             ^^

tests-pre-ghc-9.4/ErrorTests.hs:44:14: warning: [-Wdeferred-type-errors]
    Couldn't match type 'False with 'True
      arising from a use of natVal
   |
44 | testFail10 = natVal (Proxy :: Proxy (CLog 1 4))
   |              ^^^^^^

tests-pre-ghc-9.4/ErrorTests.hs:47:14: warning: [-Wdeferred-type-errors]
    Couldn't match type Data.Type.Ord.OrdCond
                           (CmpNat (CLog 2 4) (CLog 4 4)) 'True 'True 'False
                   with 'True
      arising from a use of natVal
   |
47 | testFail11 = natVal (Proxy :: Proxy ((CLog 4 4) - (CLog 2 4)))
   |              ^^^^^^

tests-pre-ghc-9.4/ErrorTests.hs:50:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type Div 4 0 with 4
      Expected: Proxy (Div 4 0) -> Proxy 4
        Actual: Proxy 4 -> Proxy 4
    " In the expression: id
      In an equation for testFail12: testFail12 = id
   |
50 | testFail12 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:53:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type Mod 4 0 with 4
      Expected: Proxy (Mod 4 0) -> Proxy 4
        Actual: Proxy 4 -> Proxy 4
    " In the expression: id
      In an equation for testFail13: testFail13 = id
   |
53 | testFail13 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:56:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type FLog 0 4 with 100
      Expected: Proxy (FLog 0 4) -> Proxy 100
        Actual: Proxy 100 -> Proxy 100
    " In the expression: id
      In an equation for testFail14: testFail14 = id
   |
56 | testFail14 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:59:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type FLog 1 4 with 100
      Expected: Proxy (FLog 1 4) -> Proxy 100
        Actual: Proxy 100 -> Proxy 100
    " In the expression: id
      In an equation for testFail15: testFail15 = id
   |
59 | testFail15 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:62:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type FLog 4 0 with 0
      Expected: Proxy (FLog 4 0) -> Proxy 0
        Actual: Proxy 0 -> Proxy 0
    " In the expression: id
      In an equation for testFail16: testFail16 = id
   |
62 | testFail16 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:65:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type LCM 6 8 with 48
      Expected: Proxy (LCM 6 8) -> Proxy 48
        Actual: Proxy 48 -> Proxy 48
    " In the expression: id
      In an equation for testFail17: testFail17 = id
   |
65 | testFail17 = id
   |              ^^

tests-pre-ghc-9.4/ErrorTests.hs:71:14: warning: [-Wdeferred-type-errors]
    Couldn't match type: FLog 3 0
                   with: CLog 3 0
      arising from a use of natVal
   |
71 | testFail19 = natVal (Proxy :: Proxy (Log 3 0))
   |              ^^^^^^

tests-pre-ghc-9.4/ErrorTests.hs:74:14: warning: [-Wdeferred-type-errors]
    Couldn't match type: FLog 3 10
                   with: CLog 3 10
      arising from a use of natVal
   |
74 | testFail20 = natVal (Proxy :: Proxy (Log 3 10))
   |              ^^^^^^

tests-pre-ghc-9.4/ErrorTests.hs:77:18: warning: [-Wdeferred-type-errors]
    " Couldn't match type a with Min a (a * b)
      Expected: Proxy (Min a (a * b)) -> Proxy a
        Actual: Proxy a -> Proxy a
      a is a rigid type variable bound by
        the type signature for:
          testFail21 :: forall (a :: Nat) (b :: Natural).
                        Proxy a -> Proxy b -> Proxy (Min a (a * b)) -> Proxy a
        at tests-pre-ghc-9.4/ErrorTests.hs:76:1-66
    " In the expression: id
      In an equation for testFail21: testFail21 _ _ = id
    " Relevant bindings include
        testFail21 :: Proxy a
                      -> Proxy b -> Proxy (Min a (a * b)) -> Proxy a
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:77:1)
   |
77 | testFail21 _ _ = id
   |                  ^^

tests-pre-ghc-9.4/ErrorTests.hs:80:18: warning: [-Wdeferred-type-errors]
    " Couldn't match type: Max a (a * b)
                     with: a * b
      Expected: Proxy (Max a (a * b)) -> Proxy (a * b)
        Actual: Proxy (Max a (a * b)) -> Proxy (Max a (a * b))
    " In the expression: id
      In an equation for testFail22: testFail22 _ _ = id
    " Relevant bindings include
        testFail22 :: Proxy a
                      -> Proxy b -> Proxy (Max a (a * b)) -> Proxy (a * b)
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:80:1)
   |
80 | testFail22 _ _ = id
   |                  ^^

tests-pre-ghc-9.4/ErrorTests.hs:86:14: warning: [-Wdeferred-type-errors]
    " Couldn't match type 'True with 'False
        arising from a use of testFail23'
    " In the expression: testFail23' (Proxy @18) (Proxy @3)
      In an equation for testFail23:
          testFail23 = testFail23' (Proxy @18) (Proxy @3)
   |
86 | testFail23 = testFail23' (Proxy @18) (Proxy @3)
   |              ^^^^^^^^^^^

tests-pre-ghc-9.4/ErrorTests.hs:89:20: warning: [-Wdeferred-type-errors]
    " Couldn't match type Data.Type.Ord.OrdCond
                             (CmpNat z (Max x y)) 'True 'True 'False
                     with 'True
      Expected: Proxy (z <=? Max x y) -> Proxy 'True
        Actual: Proxy 'True -> Proxy 'True
    " In the expression: id
      In an equation for testFail24: testFail24 _ _ _ = id
    " Relevant bindings include
        testFail24 :: Proxy x
                      -> Proxy y -> Proxy z -> Proxy (z <=? Max x y) -> Proxy 'True
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:89:1)
   |
89 | testFail24 _ _ _ = id
   |                    ^^

tests-pre-ghc-9.4/ErrorTests.hs:92:18: warning: [-Wdeferred-type-errors]
    " Couldn't match type Data.Type.Ord.OrdCond
                             (CmpNat (x + 1) (Max x y)) 'True 'True 'False
                     with 'True
      Expected: Proxy ((x + 1) <=? Max x y) -> Proxy 'True
        Actual: Proxy 'True -> Proxy 'True
    " In the expression: id
      In an equation for testFail25: testFail25 _ _ = id
    " Relevant bindings include
        testFail25 :: Proxy x
                      -> Proxy y -> Proxy ((x + 1) <=? Max x y) -> Proxy 'True
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:92:1)
   |
92 | testFail25 _ _ = id
   |                  ^^

tests-pre-ghc-9.4/ErrorTests.hs:96:21: warning: [-Wdeferred-type-errors]
    " Could not deduce: Max x y ~ n
      from the context: (x <=? n) ~ 'True
        bound by the type signature for:
                   testFail26' :: forall (x :: Nat) (n :: Nat) (y :: Nat).
                                  ((x <=? n) ~ 'True) =>
                                  Proxy x -> Proxy y -> Proxy n -> Proxy (Max x y) -> Proxy n
        at tests-pre-ghc-9.4/ErrorTests.hs:95:1-99
      Expected: Proxy (Max x y) -> Proxy n
        Actual: Proxy n -> Proxy n
      n is a rigid type variable bound by
        the type signature for:
          testFail26' :: forall (x :: Nat) (n :: Nat) (y :: Nat).
                         ((x <=? n) ~ 'True) =>
                         Proxy x -> Proxy y -> Proxy n -> Proxy (Max x y) -> Proxy n
        at tests-pre-ghc-9.4/ErrorTests.hs:95:1-99
    " In the expression: id
      In an equation for testFail26': testFail26' _ _ _ = id
    " Relevant bindings include
        testFail26' :: Proxy x
                       -> Proxy y -> Proxy n -> Proxy (Max x y) -> Proxy n
          (bound at tests-pre-ghc-9.4/ErrorTests.hs:96:1)
   |
96 | testFail26' _ _ _ = id
   |                     ^^
[2 of 2] Compiling Main             ( tests/Main.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/test-ghc-typelits-extra/test-ghc-typelits-extra-tmp/Main.o )
Linking /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/build/test-ghc-typelits-extra/test-ghc-typelits-extra ...
Running 1 test suites...
Test suite test-ghc-typelits-extra: RUNNING...
Test suite test-ghc-typelits-extra: PASS
Test suite logged to:
/home/builder/builder-dir/build-cache/tmp-install/reports/ghc-typelits-extra-0.4.6.test
Writing: ghc-typelits-extra-0.4.6-inplace/GHC.TypeLits.Extra.hs.html
Writing: hpc_index.html
Writing: hpc_index_fun.html
Writing: hpc_index_alt.html
Writing: hpc_index_exp.html
Test coverage report written to
/home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/hpc/vanilla/html/test-ghc-typelits-extra/hpc_index.html
1 of 1 test suites (1 of 1 test cases) passed.
Writing: ghc-typelits-extra-0.4.6-inplace/GHC.TypeLits.Extra.hs.html
Writing: hpc_index.html
Writing: hpc_index_fun.html
Writing: hpc_index_alt.html
Writing: hpc_index_exp.html
Package coverage report written to
/home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.2.4/ghc-typelits-extra-0.4.6/noopt/hpc/vanilla/html/ghc-typelits-extra-0.4.6/hpc_index.html