Resolving dependencies... Build profile: -w ghc-9.6.3 -O0 In order, the following will be built (use -v for more details): - hMPC-0.1.0.2 (first run) Configuring hMPC-0.1.0.2... Preprocessing library for hMPC-0.1.0.2.. Building library for hMPC-0.1.0.2.. [ 1 of 10] Compiling Hgmp ( app/Hgmp.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Hgmp.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Hgmp.dyn_o ) app/Hgmp.hs:22:20: warning: [GHC-63397] [-Wname-shadowing] This binding for x shadows the existing binding bound at app/Hgmp.hs:17:11 | 22 | _prevPrime x | ^ [ 2 of 10] Compiling FinFields ( app/FinFields.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/FinFields.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/FinFields.dyn_o ) app/FinFields.hs:25:34: warning: [-Wpartial-fields] Use of partial record field selector: meta | 25 | data FiniteField = FiniteField {meta :: FiniteFieldMeta, value :: Integer} | ^^^^ app/FinFields.hs:33:4: warning: [GHC-63397] [-Wname-shadowing] This binding for modulus shadows the existing binding defined at app/FinFields.hs:27:41 | 33 | gf modulus = let byteLength = ((ceiling . logBase 2 . fromIntegral) modulus + 7) `shiftR` 3 | ^^^^^^^ app/FinFields.hs:33:18: warning: [GHC-63397] [-Wname-shadowing] This binding for byteLength shadows the existing binding defined at app/FinFields.hs:27:61 | 33 | gf modulus = let byteLength = ((ceiling . logBase 2 . fromIntegral) modulus + 7) `shiftR` 3 | ^^^^^^^^^^ app/FinFields.hs:33:33: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Double in the following constraints (RealFrac b0) arising from a use of ceiling at app/FinFields.hs:33:33-39 (Floating b0) arising from a use of logBase at app/FinFields.hs:33:43-49 (Num b0) arising from the literal 2 at app/FinFields.hs:33:51 " In the first argument of (.), namely ceiling In the first argument of (+), namely (ceiling . logBase 2 . fromIntegral) modulus In the first argument of shiftR, namely ((ceiling . logBase 2 . fromIntegral) modulus + 7) | 33 | gf modulus = let byteLength = ((ceiling . logBase 2 . fromIntegral) modulus + 7) `shiftR` 3 | ^^^^^^^ app/FinFields.hs:34:20: warning: [GHC-20125] [-Wmissing-fields] " Fields of FiniteField not initialised: value :: Integer " In the expression: FiniteField {meta = FiniteFieldMeta {modulus = modulus, byteLength = byteLength}} In the expression: let byteLength = ((ceiling . logBase 2 . fromIntegral) modulus + 7) `shiftR` 3 in FiniteField {meta = FiniteFieldMeta {modulus = modulus, byteLength = byteLength}} In an equation for gf: gf modulus = let byteLength = ((ceiling . logBase 2 . fromIntegral) modulus + 7) `shiftR` 3 in FiniteField {meta = FiniteFieldMeta {modulus = modulus, byteLength = byteLength}} | 34 | in FiniteField{meta = FiniteFieldMeta {modulus = modulus, byteLength = byteLength}} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/FinFields.hs:37:10: warning: [GHC-06201] [-Wmissing-methods] " No explicit implementation for fromRational " In the instance declaration for Fractional FiniteField | 37 | instance Fractional FiniteField where | ^^^^^^^^^^^^^^^^^^^^^^ app/FinFields.hs:46:10: warning: [GHC-06201] [-Wmissing-methods] " No explicit implementation for abs and signum " In the instance declaration for Num FiniteField | 46 | instance Num FiniteField where | ^^^^^^^^^^^^^^^ app/FinFields.hs:53:27: warning: [GHC-63397] [-Wname-shadowing] This binding for meta shadows the existing binding defined at app/FinFields.hs:25:34 | 53 | _applyOpFF f (FiniteField meta val1) (FiniteField _ val2) = _makeFF meta (f val1 val2) | ^^^^ app/FinFields.hs:54:27: warning: [GHC-63397] [-Wname-shadowing] This binding for meta shadows the existing binding defined at app/FinFields.hs:25:34 | 54 | _applyOpFF f (FiniteField meta val1) (Literal val2) = _makeFF meta (f val1 val2) | ^^^^ app/FinFields.hs:55:42: warning: [GHC-63397] [-Wname-shadowing] This binding for meta shadows the existing binding defined at app/FinFields.hs:25:34 | 55 | _applyOpFF f (Literal val1) (FiniteField meta val2) = _makeFF meta (f val1 val2) | ^^^^ app/FinFields.hs:59:9: warning: [GHC-63397] [-Wname-shadowing] This binding for meta shadows the existing binding defined at app/FinFields.hs:25:34 | 59 | _makeFF meta val = FiniteField meta (val `mod` modulus meta) | ^^^^ app/FinFields.hs:63:9: warning: [GHC-63397] [-Wname-shadowing] This binding for byteLength shadows the existing binding defined at app/FinFields.hs:27:61 | 63 | toBytes byteLength x = B.pack $ concatMap (\a -> map (\i -> fromIntegral ((a `shiftR` (i * 8)) .&. 0xFF)) [0..byteLength-1]) x | ^^^^^^^^^^ [ 3 of 10] Compiling MpcTools ( app/MpcTools.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/MpcTools.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/MpcTools.dyn_o ) app/MpcTools.hs:1:1: warning: [GHC-85401] [-Wmissing-export-lists] The export item module MpcTools is missing an export list | 1 | module MpcTools where | ^ [ 4 of 10] Compiling Parser ( app/Parser.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Parser.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Parser.dyn_o ) [ 5 of 10] Compiling Paths_hMPC ( /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/autogen/Paths_hMPC.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Paths_hMPC.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Paths_hMPC.dyn_o ) [ 6 of 10] Compiling Shamir ( app/Shamir.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Shamir.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Shamir.dyn_o ) app/Shamir.hs:14:1: warning: [-Wunused-imports] The import of Control.Monad is redundant except perhaps to import instances from Control.Monad To import instances alone, use: import Control.Monad() | 14 | import Control.Monad | ^^^^^^^^^^^^^^^^^^^^ app/Shamir.hs:17:8: warning: [-Wcompat-unqualified-imports] To ensure compatibility with future core libraries changes imports to Data.List should be either qualified or have an explicit import list. | 17 | import Data.List | ^^^^^^^^^ app/Shamir.hs:32:9: warning: [GHC-63397] [-Wname-shadowing] This binding for randoms shadows the existing binding imported from System.Random at app/Shamir.hs:16:1-20 | 32 | randoms gen len bound = let (gen1, gen2) = split gen | ^^^^^^^ app/Shamir.hs:47:22: warning: [-Wunused-matches] Defined but not used: field | 47 | _recombinationVector field xs x_r = map coefs_div (zip [0..] xs) | ^^^^^ app/Shamir.hs:47:41: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraints (Eq a0) arising from a use of coefs_div at app/Shamir.hs:47:41-49 (Num a0) arising from a use of coefs_div at app/Shamir.hs:47:41-49 (Enum a0) arising from a use of coefs_div at app/Shamir.hs:47:41-49 " In the first argument of map, namely coefs_div In the expression: map coefs_div (zip [0 .. ] xs) In an equation for _recombinationVector: _recombinationVector field xs x_r = map coefs_div (zip [0 .. ] xs) where coefs_div (i, x_i) = let ... in cf_n `div` cf_d coefs i x_i = foldr (\ (j, x_j) (coef_n, coef_d) -> if j /= i then ... else ...) (1, 1) (zip [0 .. ] xs) | 47 | _recombinationVector field xs x_r = map coefs_div (zip [0..] xs) | ^^^^^^^^^ app/Shamir.hs:66:13: warning: [GHC-63397] [-Wname-shadowing] This binding for sum shadows the existing binding imported from Data.List at app/Shamir.hs:17:1-16 (and originally defined in Data.Foldable) | 66 | sum share_i vector = foldr (\(i, s) -> (+) (s * (vector !! i) )) 0 (zip [0..] share_i) | ^^^ [ 7 of 10] Compiling Types ( app/Types.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Types.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Types.dyn_o ) app/Types.hs:1:1: warning: [GHC-85401] [-Wmissing-export-lists] The export item module Types is missing an export list | 1 | module Types where | ^ [ 8 of 10] Compiling SecTypes ( app/SecTypes.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/SecTypes.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/SecTypes.dyn_o ) app/SecTypes.hs:1:1: warning: [GHC-85401] [-Wmissing-export-lists] The export item module SecTypes is missing an export list | 1 | {- | | ^ app/SecTypes.hs:26:13: warning: [-Wpartial-fields] Use of partial record field selector: field | 26 | SecFld {field :: FiniteField, share :: MVar FiniteField, bitLength :: Int} | ^^^^^ app/SecTypes.hs:26:62: warning: [-Wpartial-fields] Use of partial record field selector: bitLength | 26 | SecFld {field :: FiniteField, share :: MVar FiniteField, bitLength :: Int} | ^^^^^^^^^ app/SecTypes.hs:35:9: warning: [GHC-63397] [-Wname-shadowing] This binding for field shadows the existing binding defined at app/SecTypes.hs:26:13 | 35 | let field = FinFields.gf (Hgmp.prevPrime $ 1 `shiftL` (l + k + 2)) | ^^^^^ app/SecTypes.hs:36:25: warning: [GHC-20125] [-Wmissing-fields] " Fields of SecInt not initialised: share :: MVar FiniteField " In the second argument of ($), namely SecInt {field = field, bitLength = l} In the second argument of ($), namely setShare $ SecInt {field = field, bitLength = l} In a stmt of a 'do' block: return $ setShare $ SecInt {field = field, bitLength = l} | 36 | return $ setShare $ SecInt {field = field, bitLength = l} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/SecTypes.hs:42:22: warning: [GHC-63397] [-Wname-shadowing] This binding for field shadows the existing binding defined at app/SecTypes.hs:26:13 | 42 | secFldGen pnew = let field = FinFields.gf pnew | ^^^^^ app/SecTypes.hs:43:22: warning: [GHC-63397] [-Wname-shadowing] This binding for bitLength shadows the existing binding defined at app/SecTypes.hs:26:62 | 43 | bitLength = (ceiling . logBase 2 . fromIntegral) pnew | ^^^^^^^^^ app/SecTypes.hs:43:35: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Double in the following constraints (RealFrac b0) arising from a use of ceiling at app/SecTypes.hs:43:35-41 (Floating b0) arising from a use of logBase at app/SecTypes.hs:43:45-51 (Num b0) arising from the literal 2 at app/SecTypes.hs:43:53 " In the first argument of (.), namely ceiling In the expression: (ceiling . logBase 2 . fromIntegral) pnew In an equation for bitLength: bitLength = (ceiling . logBase 2 . fromIntegral) pnew | 43 | bitLength = (ceiling . logBase 2 . fromIntegral) pnew | ^^^^^^^ app/SecTypes.hs:44:32: warning: [GHC-20125] [-Wmissing-fields] " Fields of SecFld not initialised: share :: MVar FiniteField " In the second argument of ($), namely SecFld {field = field, bitLength = bitLength} In the expression: setShare $ SecFld {field = field, bitLength = bitLength} In the expression: let field = gf pnew bitLength = (ceiling . logBase 2 . fromIntegral) pnew in setShare $ SecFld {field = field, bitLength = bitLength} | 44 | in setShare $ SecFld {field = field, bitLength = bitLength} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ [ 9 of 10] Compiling Asyncoro ( app/Asyncoro.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Asyncoro.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Asyncoro.dyn_o ) app/Asyncoro.hs:11:1: warning: [-Wunused-imports] The import of System.IO.Error is redundant except perhaps to import instances from System.IO.Error To import instances alone, use: import System.IO.Error() | 11 | import System.IO.Error | ^^^^^^^^^^^^^^^^^^^^^^ app/Asyncoro.hs:15:8: warning: [-Wcompat-unqualified-imports] To ensure compatibility with future core libraries changes imports to Data.List should be either qualified or have an explicit import list. | 15 | import Data.List | ^^^^^^^^^ app/Asyncoro.hs:30:19: warning: [GHC-63397] [-Wname-shadowing] This binding for myPid shadows the existing binding imported from Parser at app/Asyncoro.hs:25:1-13 (and originally defined at app/Parser.hs:15:44-48) | 30 | createConnections myPid parties = do | ^^^^^ app/Asyncoro.hs:30:25: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:22:5-11) | 30 | createConnections myPid parties = do | ^^^^^^^ app/Asyncoro.hs:31:9: warning: [GHC-63397] [-Wname-shadowing] This binding for m shadows the existing binding imported from Parser at app/Asyncoro.hs:25:1-13 (and originally defined at app/Parser.hs:15:30) | 31 | let m = length parties | ^ app/Asyncoro.hs:33:5: warning: [GHC-63397] [-Wname-shadowing] This binding for sock shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:101-104) | 33 | sock <- socket AF_INET Stream 0 -- create socket | ^^^^ app/Asyncoro.hs:39:9: warning: [GHC-81995] [-Wunused-do-bind] A do-notation statement discarded a result of type ThreadId Suggested fix: Suppress this warning by saying _ <- forkIO $ connectServer sock parties mvar | 39 | forkIO $ connectServer sock parties mvar | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Asyncoro.hs:44:7: warning: [GHC-81995] [-Wunused-do-bind] A do-notation statement discarded a result of type ThreadId Suggested fix: Suppress this warning by saying _ <- forkIO $ connectClient myPid party mvar | 44 | forkIO $ connectClient myPid party mvar | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Asyncoro.hs:58:5: warning: [GHC-63397] [-Wname-shadowing] This binding for newMVar shadows the existing binding imported from Control.Concurrent at app/Asyncoro.hs:10:1-25 (and originally defined in GHC.MVar) | 58 | newMVar <- newMVar 0 | ^^^^^^^ app/Asyncoro.hs:64:19: warning: [GHC-63397] [-Wname-shadowing] This binding for sock shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:101-104) | 64 | connectServer sock parties mvar = do | ^^^^ app/Asyncoro.hs:64:24: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding bound at app/Asyncoro.hs:30:25 | 64 | connectServer sock parties mvar = do | ^^^^^^^ app/Asyncoro.hs:67:7: warning: [GHC-62161] [-Wincomplete-patterns] Pattern match(es) are non-exhaustive In a case alternative: Patterns of type Either String Int not matched: Left _ | 67 | case Enc.decode msg of | ^^^^^^^^^^^^^^^^^^^^^^^... app/Asyncoro.hs:70:19: warning: [GHC-63397] [-Wname-shadowing] This binding for pid shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:21-23) | 70 | connectClient pid peer mvar = do | ^^^ app/Asyncoro.hs:72:7: warning: [GHC-63397] [-Wname-shadowing] This binding for sock shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:101-104) | 72 | sock <- openSocket addr | ^^^^ app/Asyncoro.hs:82:20: warning: [GHC-63397] [-Wname-shadowing] This binding for sock shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:101-104) | 82 | initConnection sock peer mvar = do | ^^^^ app/Asyncoro.hs:85:7: warning: [GHC-63397] [-Wname-shadowing] This binding for outChan shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:70-76) | 85 | outChan <- newChan | ^^^^^^^ app/Asyncoro.hs:92:20: warning: [GHC-63397] [-Wname-shadowing] This binding for sock shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:101-104) | 92 | runConnection chan sock dictMvar nbytesSent = do | ^^^^ app/Asyncoro.hs:92:34: warning: [GHC-63397] [-Wname-shadowing] This binding for nbytesSent shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:142-151) | 92 | runConnection chan sock dictMvar nbytesSent = do | ^^^^^^^^^^ app/Asyncoro.hs:106:27: warning: [-Wunused-matches] Defined but not used: dictMvar | 106 | decodeMessageChecks dictMvar nbytesSent buffer = do | ^^^^^^^^ app/Asyncoro.hs:106:27: warning: [GHC-63397] [-Wname-shadowing] This binding for dictMvar shadows the existing binding bound at app/Asyncoro.hs:92:25 | 106 | decodeMessageChecks dictMvar nbytesSent buffer = do | ^^^^^^^^ app/Asyncoro.hs:106:36: warning: [-Wunused-matches] Defined but not used: nbytesSent | 106 | decodeMessageChecks dictMvar nbytesSent buffer = do | ^^^^^^^^^^ app/Asyncoro.hs:106:36: warning: [GHC-63397] [-Wname-shadowing] This binding for nbytesSent shadows the existing binding bound at app/Asyncoro.hs:92:34 | 106 | decodeMessageChecks dictMvar nbytesSent buffer = do | ^^^^^^^^^^ app/Asyncoro.hs:119:13: warning: [GHC-63397] [-Wname-shadowing] This binding for pc shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:23:5-6) | 119 | pc = _decode Enc.getInt64le (BS.drop 4 buffer) | ^^ app/Asyncoro.hs:121:33: warning: [GHC-63397] [-Wname-shadowing] This binding for dict shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:123-126) | 121 | modifyMVar_ dictMvar $ \dict -> | ^^^^ app/Asyncoro.hs:132:9: warning: [GHC-62161] [-Wincomplete-patterns] Pattern match(es) are non-exhaustive In a case alternative: Patterns of type Either String a not matched: Left _ | 132 | case Enc.runGet (liftM fromIntegral decoder) buffer of | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^... app/Asyncoro.hs:137:9: warning: [GHC-63397] [-Wname-shadowing] This binding for pc shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:23:5-6) | 137 | receive pc party = liftIO $ modifyMVar (dict party) $ \dict -> do | ^^ app/Asyncoro.hs:137:56: warning: [GHC-63397] [-Wname-shadowing] This binding for dict shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:16:123-126) | 137 | receive pc party = liftIO $ modifyMVar (dict party) $ \dict -> do | ^^^^ app/Asyncoro.hs:139:14: warning: [GHC-63397] [-Wname-shadowing] This binding for value shadows the existing binding imported from FinFields at app/Asyncoro.hs:22:1-16 (and originally defined at app/FinFields.hs:25:59-63) | 139 | Just value -> return (Map.delete pc dict, value) | ^^^^^ app/Asyncoro.hs:146:20: warning: [GHC-39567] [-Wstar-is-type] Using * (or its Unicode variant) to mean Data.Kind.Type relies on the StarIsType extension, which will become deprecated in the future. Suggested fix: Use Type from Data.Kind instead. | 146 | type Result a :: * | ^ app/Asyncoro.hs:187:6: warning: [GHC-63397] [-Wname-shadowing] This binding for pc shadows the existing binding imported from Types at app/Asyncoro.hs:13:1-12 (and originally defined at app/Types.hs:23:5-6) | 187 | send pc payload party = do | ^^ app/Asyncoro.hs:212:5: warning: [GHC-63397] [-Wname-shadowing] This binding for state shadows the existing binding imported from Control.Monad.State at app/Asyncoro.hs:20:1-26 (and originally defined in Control.Monad.State.Class) | 212 | state <- get | ^^^^^ [10 of 10] Compiling Runtime ( app/Runtime.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Runtime.o, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/Runtime.dyn_o ) app/Runtime.hs:18:8: warning: [-Wcompat-unqualified-imports] To ensure compatibility with future core libraries changes imports to Data.List should be either qualified or have an explicit import list. | 18 | import Data.List | ^^^^^^^^^ app/Runtime.hs:63:5: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 63 | env <- Runtime.start | ^^^ app/Runtime.hs:68:5: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 68 | parties <- gets parties | ^^^^^^^ app/Runtime.hs:82:5: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 82 | parties <- gets parties | ^^^^^^^ app/Runtime.hs:92:21: warning: [GHC-62161] [-Wincomplete-patterns] Pattern match(es) are non-exhaustive In a case alternative: Patterns of type Either String a not matched: Left _ | 92 | case (decode bytes) of | ^^^^^^^^^^^^^^^^^^^^^^^... app/Runtime.hs:110:21: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 110 | Env{parties=parties, options=opts, gen=_gen} <- get | ^^^^^^^ app/Runtime.hs:115:17: warning: [GHC-63397] [-Wname-shadowing] This binding for length shadows the existing binding imported from Prelude at app/Runtime.hs:31:1-14 (and originally defined in Data.Foldable) | 115 | length = (byteLength . meta) ftype | ^^^^^^ app/Runtime.hs:117:22: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 117 | modify (\env -> env{gen = g''}) | ^^^ app/Runtime.hs:126:32: warning: [GHC-63397] [-Wname-shadowing] This binding for share shadows the existing binding imported from SecTypes at app/Runtime.hs:35:1-15 (and originally defined at app/SecTypes.hs:26:35-39) | 126 | return $ map (\share -> ftype{value = share}) shares | ^^^^^ app/Runtime.hs:138:21: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 138 | Env{parties=parties, options=opts, gen=_gen} <- incPC >> get | ^^^^^^^ app/Runtime.hs:140:13: warning: [GHC-63397] [-Wname-shadowing] This binding for length shadows the existing binding imported from Prelude at app/Runtime.hs:31:1-14 (and originally defined in Data.Foldable) | 140 | length = (byteLength . meta) ftype | ^^^^^^ app/Runtime.hs:143:18: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 143 | modify (\env -> env{gen = g''}) | ^^^ app/Runtime.hs:145:49: warning: [GHC-63397] [-Wname-shadowing] This binding for share shadows the existing binding imported from SecTypes at app/Runtime.hs:35:1-15 (and originally defined at app/SecTypes.hs:26:35-39) | 145 | points <- forM (zip shares parties) $ \(share, party) -> do | ^^^^^ app/Runtime.hs:168:5: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 168 | parties <- gets parties | ^^^^^^^ app/Runtime.hs:172:13: warning: [GHC-63397] [-Wname-shadowing] This binding for length shadows the existing binding imported from Prelude at app/Runtime.hs:31:1-14 (and originally defined in Data.Foldable) | 172 | length = (byteLength . meta . head) s | ^^^^^^ app/Runtime.hs:190:17: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 190 | Env{parties=parties, options=opt, forkIOBarrier=barrier, startTime=_startTime} <- get | ^^^^^^^ app/Runtime.hs:202:5: warning: [GHC-81995] [-Wunused-do-bind] A do-notation statement discarded a result of type [Integer] Suggested fix: Suppress this warning by saying _ <- await =<< transfer (myPid opt) | 202 | await =<< transfer (myPid opt) | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:206:9: warning: [GHC-62161] [-Wincomplete-patterns] Pattern match(es) are non-exhaustive In a case alternative: Patterns of type Maybe Socket not matched: Nothing | 206 | case (sock party) of | ^^^^^^^^^^^^^^^^^^^^^... app/Runtime.hs:322:41: warning: [GHC-63397] [-Wname-shadowing] This binding for e shadows the existing binding bound at app/Runtime.hs:322:18 | 322 | let (e, sumXors) = foldl (\(e, sumXors) (bit, i) -> | ^ app/Runtime.hs:322:44: warning: [GHC-63397] [-Wname-shadowing] This binding for sumXors shadows the existing binding bound at app/Runtime.hs:322:21 | 322 | let (e, sumXors) = foldl (\(e, sumXors) (bit, i) -> | ^^^^^^^ app/Runtime.hs:322:54: warning: [GHC-63397] [-Wname-shadowing] This binding for bit shadows the existing binding imported from Data.Bits at app/Runtime.hs:19:1-16 (and originally defined in GHC.Bits) | 322 | let (e, sumXors) = foldl (\(e, sumXors) (bit, i) -> | ^^^ app/Runtime.hs:331:21: warning: [GHC-20125] [-Wmissing-fields] " Fields of FiniteField not initialised: meta :: FiniteFieldMeta value :: Integer " In the first argument of return, namely FiniteField {} In the expression: return FiniteField {} In a stmt of a 'do' block: z1 <- if not eq then do s_sign <- value <$> (randomBits (return a) 1 True >>= head >>= gather) let (e, sumXors) = ... g <- await =<< (isZeroPublic $ sproduct (setShare a (s_sign - 1 + 3 * sumXors) : e)) .... else return FiniteField {} | 331 | else return FiniteField{} | ^^^^^^^^^^^^^ app/Runtime.hs:334:49: warning: [GHC-63397] [-Wname-shadowing] This binding for bit shadows the existing binding imported from Data.Bits at app/Runtime.hs:19:1-16 (and originally defined in GHC.Bits) | 334 | h <- await . share =<< sall (map (\(bit, i) -> | ^^^ app/Runtime.hs:353:13: warning: [GHC-63397] [-Wname-shadowing] This binding for m shadows the existing binding imported from Parser at app/Runtime.hs:34:1-13 (and originally defined at app/Parser.hs:15:30) | 353 | m <- ifElse c m1 m0 | ^ app/Runtime.hs:372:5: warning: [GHC-63397] [-Wname-shadowing] This binding for m shadows the existing binding imported from Parser at app/Runtime.hs:34:1-13 (and originally defined at app/Parser.hs:15:30) | 372 | m <- ifElse c m1 m0 | ^ app/Runtime.hs:399:75: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Double in the following constraints (Num b0) arising from the literal 2 at app/Runtime.hs:399:75 (Floating b0) arising from a use of logBase at app/Runtime.hs:399:67-73 (RealFrac b0) arising from a use of ceiling at app/Runtime.hs:399:57-63 " In the first argument of logBase, namely 2 In the first argument of (.), namely logBase 2 In the second argument of (.), namely logBase 2 . fromIntegral | 399 | (leftover ++) <$> reshare xmul) (gather x) !! ((ceiling . logBase 2 . fromIntegral) (length x)) | ^ app/Runtime.hs:411:75: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Double in the following constraints (Num b0) arising from the literal 2 at app/Runtime.hs:411:75 (Floating b0) arising from a use of logBase at app/Runtime.hs:411:67-73 (RealFrac b0) arising from a use of ceiling at app/Runtime.hs:411:57-63 " In the first argument of logBase, namely 2 In the first argument of (.), namely logBase 2 In the second argument of (.), namely logBase 2 . fromIntegral | 411 | (leftover ++) <$> reshare xmul) (gather x) !! ((ceiling . logBase 2 . fromIntegral) (length x)) | ^ app/Runtime.hs:421:46: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Double in the following constraints (RealFrac b0) arising from a use of floor at app/Runtime.hs:421:46-50 (Floating b0) arising from a use of logBase at app/Runtime.hs:421:54-60 (Num b0) arising from the literal 2 at app/Runtime.hs:421:62 " In the first argument of (.), namely floor In the second argument of max, namely ((floor . logBase 2 . fromIntegral) (b `div` (t + 1))) In the second argument of shiftL, namely max 0 ((floor . logBase 2 . fromIntegral) (b `div` (t + 1))) | 421 | Just b -> 1 `shiftL` max 0 ((floor . logBase 2 . fromIntegral) (b `div` (t + 1))) | ^^^^^ app/Runtime.hs:424:14: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 424 | modify (\env -> env{gen = g''}) | ^^^ app/Runtime.hs:435:19: warning: [GHC-04214] [-Widentities] Call of fromIntegral :: Int -> Int can probably be omitted | 435 | let x = take (fromIntegral n) $ randomRs (0, 1) g' | ^^^^^^^^^^^^ app/Runtime.hs:436:14: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 436 | modify (\env -> env{gen = g''}) | ^^^ app/Runtime.hs:437:28: warning: [GHC-63397] [-Wname-shadowing] This binding for bit shadows the existing binding imported from Data.Bits at app/Runtime.hs:19:1-16 (and originally defined in GHC.Bits) | 437 | xlist <- input $ map (\bit -> do | ^^^ app/Runtime.hs:441:42: warning: [GHC-63397] [-Wname-shadowing] This binding for x shadows the existing binding bound at app/Runtime.hs:435:9 | 441 | secbits <- forM (transpose xlist) $ \x -> do | ^ app/Runtime.hs:501:1: warning: [-Wunused-top-binds] Defined but not used: randomR' | 501 | randomR' range = do | ^^^^^^^^ app/Runtime.hs:503:10: warning: [GHC-63397] [-Wname-shadowing] This binding for value shadows the existing binding imported from FinFields at app/Runtime.hs:36:1-16 (and originally defined at app/FinFields.hs:25:59-63) | 503 | let (value, newGen) = randomR range _gen | ^^^^^ app/Runtime.hs:504:14: warning: [GHC-63397] [-Wname-shadowing] This binding for env shadows the existing binding imported from System.Process at app/Runtime.hs:27:1-21 (and originally defined in process-1.6.17.0:System.Process.Common) | 504 | modify (\env -> env{gen = newGen}) | ^^^ app/Runtime.hs:516:5: warning: [GHC-63397] [-Wname-shadowing] This binding for pc shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:23:5-6) | 516 | pc <- gets pc | ^^ app/Runtime.hs:522:5: warning: [GHC-63397] [-Wname-shadowing] This binding for pc shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:23:5-6) | 522 | pc <- gets pc | ^^ app/Runtime.hs:528:17: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:22:5-11) | 528 | Env{parties=parties, options=opt} <- get | ^^^^^^^ app/Runtime.hs:530:9: warning: [GHC-63397] [-Wname-shadowing] This binding for parties shadows the existing binding bound at app/Runtime.hs:528:17 | 530 | parties <- Asyncoro.createConnections (fromInteger $ myPid opt) parties | ^^^^^^^ app/Runtime.hs:532:9: warning: [GHC-63397] [-Wname-shadowing] This binding for gen shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:26:5-7) | 532 | gen <- newStdGen | ^^^ app/Runtime.hs:534:9: warning: [GHC-63397] [-Wname-shadowing] This binding for startTime shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:27:5-13) | 534 | startTime <- getCurrentTime | ^^^^^^^^^ app/Runtime.hs:559:20: warning: [GHC-20125] [-Wmissing-fields] " Fields of Env not initialised: pc :: Int forkIOBarrier :: Barrier gen :: StdGen startTime :: UTCTime " In the first argument of return, namely Env {options = opt {myPid = _mypid, m = _m, noAsync = _noASync}, parties = _parties} In a stmt of a 'do' block: return Env {options = opt {myPid = _mypid, m = _m, noAsync = _noASync}, parties = _parties} In the expression: do let _m = ... when (_m > 1 && (myPid opt) == - 1) $ do exPath <- getExecutablePath args <- getArgs .... let _mypid = ... _parties = map (\ i -> ...) ... .... return Env {options = opt {myPid = _mypid, m = _m, noAsync = _noASync}, parties = _parties} | 559 | return Env{options = opt{myPid = _mypid, m = _m, noAsync = _noASync}, parties = _parties} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:563:33: warning: [GHC-62161] [-Wincomplete-uni-patterns] Pattern match(es) are non-exhaustive In a lambda abstraction: Patterns of type (Integer, [[Char]]) not matched: (_, []) (_, [_]) (_, (_:_:_:_)) | 563 | _parties = map (\(i, [host, port]) -> mkParty i (if null host then "127.0.0.1" else host) (read port)) (zip [0..] addresses) | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:563:39: warning: [GHC-63397] [-Wname-shadowing] This binding for host shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:16:37-40) | 563 | _parties = map (\(i, [host, port]) -> mkParty i (if null host then "127.0.0.1" else host) (read port)) (zip [0..] addresses) | ^^^^ app/Runtime.hs:563:45: warning: [GHC-63397] [-Wname-shadowing] This binding for port shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:16:53-56) | 563 | _parties = map (\(i, [host, port]) -> mkParty i (if null host then "127.0.0.1" else host) (read port)) (zip [0..] addresses) | ^^^^ app/Runtime.hs:565:20: warning: [GHC-20125] [-Wmissing-fields] " Fields of Env not initialised: pc :: Int forkIOBarrier :: Barrier gen :: StdGen startTime :: UTCTime " In the first argument of return, namely Env {options = opt {myPid = _mypid, m = _m}, parties = _parties} In a stmt of a 'do' block: return Env {options = opt {myPid = _mypid, m = _m}, parties = _parties} In the expression: do let addresses = map (\ addr -> ...) (parsParties opt) _mypid = maybe (myPid opt) fromIntegral (elemIndex "" (map head addresses)) .... return Env {options = opt {myPid = _mypid, m = _m}, parties = _parties} | 565 | return Env{options = opt{myPid = _mypid, m = _m}, parties = _parties} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:567:9: warning: [GHC-63397] [-Wname-shadowing] This binding for threshold shadows the existing binding imported from Parser at app/Runtime.hs:34:1-13 (and originally defined at app/Parser.hs:16:5-13) | 567 | let threshold = ((m _opt)-1) `div` 2 | ^^^^^^^^^ app/Runtime.hs:568:12: warning: [GHC-20125] [-Wmissing-fields] " Fields of Env not initialised: pc :: Int forkIOBarrier :: Barrier gen :: StdGen startTime :: UTCTime " In the first argument of return, namely Env {options = _opt {threshold = threshold}, parties = _parties} In a stmt of a 'do' block: return Env {options = _opt {threshold = threshold}, parties = _parties} In the expression: do setNumCapabilities =<< maybe getNumCapabilities return (nrThreads opt) h <- streamHandler stdout INFO >>= \ lh -> return $ setFormatter lh (tfLogFormatter "%Y-%m-%d %H:%M:%S%Q" "$time $msg") updateGlobalLogger rootLoggerName (setHandlers [h] . setLevel INFO) Env {options = _opt, parties = _parties} <- if null (parsParties opt) then do let ... .... else do let ... .... .... | 568 | return Env{options = _opt{threshold = threshold}, parties = _parties} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:570:17: warning: [GHC-63397] [-Wname-shadowing] This binding for pid shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:16:21-23) | 570 | mkParty pid host port = Party{pid = pid, host = host, port = port} | ^^^ app/Runtime.hs:570:21: warning: [GHC-63397] [-Wname-shadowing] This binding for host shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:16:37-40) | 570 | mkParty pid host port = Party{pid = pid, host = host, port = port} | ^^^^ app/Runtime.hs:570:26: warning: [GHC-63397] [-Wname-shadowing] This binding for port shadows the existing binding imported from Types at app/Runtime.hs:32:1-12 (and originally defined at app/Types.hs:16:53-56) | 570 | mkParty pid host port = Party{pid = pid, host = host, port = port} | ^^^^ app/Runtime.hs:570:33: warning: [GHC-20125] [-Wmissing-fields] " Fields of Party not initialised: outChan :: Chan BS.ByteString sock :: Maybe Socket dict :: MVar Dict nbytesSent :: MVar Int " In the expression: Party {pid = pid, host = host, port = port} In an equation for mkParty: mkParty pid host port = Party {pid = pid, host = host, port = port} In an equation for setup: setup opt = do setNumCapabilities =<< maybe getNumCapabilities return (nrThreads opt) h <- streamHandler stdout INFO >>= \ lh -> return $ setFormatter lh (tfLogFormatter "%Y-%m-%d %H:%M:%S%Q" "$time $msg") updateGlobalLogger rootLoggerName (setHandlers [h] . setLevel INFO) .... where mkParty pid host port = Party {pid = pid, host = host, port = port} | 570 | mkParty pid host port = Party{pid = pid, host = host, port = port} | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:574:1: warning: [GHC-90177] [-Worphans] Orphan instance: instance Num (SIO SecureTypes) Suggested fix: Move the instance declaration to the module of the class or of the type, or wrap the type with a newtype and declare the instance on the new type. | 574 | instance Num (SIO SecureTypes) where | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^... app/Runtime.hs:574:10: warning: [GHC-06201] [-Wmissing-methods] " No explicit implementation for abs " In the instance declaration for Num (SIO SecureTypes) | 574 | instance Num (SIO SecureTypes) where | ^^^^^^^^^^^^^^^^^^^^^ app/Runtime.hs:582:1: warning: [GHC-90177] [-Worphans] Orphan instance: instance Fractional (SIO SecureTypes) Suggested fix: Move the instance declaration to the module of the class or of the type, or wrap the type with a newtype and declare the instance on the new type. | 582 | instance Fractional (SIO SecureTypes) where | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^... app/Runtime.hs:582:10: warning: [GHC-06201] [-Wmissing-methods] " No explicit implementation for fromRational " In the instance declaration for Fractional (SIO SecureTypes) | 582 | instance Fractional (SIO SecureTypes) where | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^ Preprocessing executable 'id3gini' for hMPC-0.1.0.2.. Building executable 'id3gini' for hMPC-0.1.0.2.. [1 of 2] Compiling Paths_hMPC ( /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/id3gini/autogen/Paths_hMPC.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/id3gini/id3gini-tmp/Paths_hMPC.o ) [2 of 2] Compiling Id3gini ( demos/Id3gini.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/id3gini/id3gini-tmp/Id3gini.o ) demos/Id3gini.hs:66:18: warning: [-Wunused-imports] The import of secIntGen from module SecTypes is redundant | 66 | import SecTypes (secIntGen, SecureTypes) | ^^^^^^^^^ demos/Id3gini.hs:93:26: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable b0 to type Integer in the following constraint Integral b0 arising from a use of fromIntegral " In the first argument of (.), namely fromIntegral In the second argument of (.<=), namely (fromIntegral . floor) ((epsilon $ opts env) * (fromIntegral $ length vt)) In the first argument of (+), namely (sizeT .<= (fromIntegral . floor) ((epsilon $ opts env) * (fromIntegral $ length vt))) | 93 | let stop = (sizeT .<= (fromIntegral . floor) ((epsilon $ opts env) * (fromIntegral $ length vt))) + (mx .== sizeT) | ^^^^^^^^^^^^ demos/Id3gini.hs:94:3: warning: [GHC-63397] [-Wname-shadowing] This binding for isZero shadows the existing binding imported from Runtime at demos/Id3gini.hs:71:1-21 | 94 | isZero <- Mpc.await =<< Mpc.isZeroPublic stop | ^^^^^^ demos/Id3gini.hs:97:7: warning: [GHC-63397] [-Wname-shadowing] This binding for i shadows the existing binding bound at demos/Id3gini.hs:91:4 | 97 | i <- Mpc.await =<< Mpc.output i | ^ demos/Id3gini.hs:116:4: warning: [GHC-63397] [-Wname-shadowing] This binding for alpha shadows the existing binding defined at demos/Id3gini.hs:85:5 | 116 | gi alpha x = do | ^^^^^ demos/Id3gini.hs:123:1: warning: [GHC-62161] [-Wincomplete-patterns] Pattern match(es) are non-exhaustive In an equation for secureFraction: Patterns of type [SIO SecureTypes], [SIO SecureTypes] not matched: [] _ [_] _ (_:_:_:_) _ [_, _] [] ... | 123 | secureFraction [n1, d1] [n2, d2] = Mpc.inProd [n1, negate d1] [d2, n2] .< 0 | ^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^^ demos/Id3gini.hs:135:8: warning: [-Wunused-matches] Defined but not used: prefix | 135 | pretty prefix (Leaf a) names ranges c = (ranges !! c) !! a | ^^^^^^ demos/Id3gini.hs:135:24: warning: [-Wunused-matches] Defined but not used: names | 135 | pretty prefix (Leaf a) names ranges c = (ranges !! c) !! a | ^^^^^ demos/Id3gini.hs:135:37: warning: [GHC-63397] [-Wname-shadowing] This binding for c shadows the existing binding defined at demos/Id3gini.hs:79:3 | 135 | pretty prefix (Leaf a) names ranges c = (ranges !! c) !! a | ^ demos/Id3gini.hs:136:46: warning: [GHC-63397] [-Wname-shadowing] This binding for c shadows the existing binding defined at demos/Id3gini.hs:79:3 | 136 | pretty prefix (Node a subtrees) names ranges c = | ^ demos/Id3gini.hs:142:1: warning: [GHC-38417] [-Wmissing-signatures] Top-level binding with no type signature: settings :: [(String, Int)] | 142 | settings = [("tennis", 32), ("balance-scale", 77), ("car", 95), | ^^^^^^^^ demos/Id3gini.hs:168:37: warning: [GHC-63397] [-Wname-shadowing] This binding for opts shadows the existing binding defined at demos/Id3gini.hs:80:3 | 168 | main = Mpc.runMpcWithArgs parser $ \opts -> do | ^^^^ demos/Id3gini.hs:175:7: warning: [GHC-63397] [-Wname-shadowing] This binding for columns shadows the existing binding imported from Options.Applicative at demos/Id3gini.hs:69:1-26 (and originally defined in Options.Applicative.Builder) | 175 | columns = transpose transactions | ^^^^^^^ demos/Id3gini.hs:183:21: warning: [GHC-63397] [-Wname-shadowing] This binding for elem shadows the existing binding imported from Prelude at demos/Id3gini.hs:58:8-14 (and originally defined in Data.Foldable) | 183 | map (\elem -> (secInt . fromIntegral . fromEnum) (attr == elem)) | ^^^^ [3 of 3] Linking /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/id3gini/id3gini Preprocessing test suite 'test-hMPC' for hMPC-0.1.0.2.. Building test suite 'test-hMPC' for hMPC-0.1.0.2.. [1 of 4] Compiling Paths_hMPC ( /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/autogen/Paths_hMPC.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/test-hMPC-tmp/Paths_hMPC.o ) [2 of 4] Compiling RuntimeTest ( test/RuntimeTest.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/test-hMPC-tmp/RuntimeTest.o ) test/RuntimeTest.hs:15:1: warning: [GHC-38417] [-Wmissing-signatures] Top-level binding with no type signature: runtimeFunctions :: IO () | 15 | runtimeFunctions = runMpc $ do | ^^^^^^^^^^^^^^^^ test/RuntimeTest.hs:17:9: warning: [-Wunused-local-binds] Defined but not used: secFld | 17 | let secFld = secFldGen 101 | ^^^^^^ test/RuntimeTest.hs:18:10: warning: [-Wunused-local-binds] Defined but not used: af | 18 | (af, bf) = (secFld 6, secFld 6) | ^^ test/RuntimeTest.hs:18:14: warning: [-Wunused-local-binds] Defined but not used: bf | 18 | (af, bf) = (secFld 6, secFld 6) | ^^ test/RuntimeTest.hs:19:10: warning: [-Wunused-local-binds] Defined but not used: a | 19 | (a, b) = (secInt (14), secInt 14) | ^ test/RuntimeTest.hs:19:13: warning: [-Wunused-local-binds] Defined but not used: b | 19 | (a, b) = (secInt (14), secInt 14) | ^ test/RuntimeTest.hs:20:14: warning: [-Wunused-local-binds] Defined but not used: v2 | 20 | (v1, v2) = (map secInt [1,8,3,10,2,7], map secInt [4,5,6]) | ^^ test/RuntimeTest.hs:21:10: warning: [-Wunused-local-binds] Defined but not used: amat | 21 | (amat, bmat) = ([v1,v2], (map . map) secInt [[10,11], [20,21], [30,31]]) | ^^^^ test/RuntimeTest.hs:21:16: warning: [-Wunused-local-binds] Defined but not used: bmat | 21 | (amat, bmat) = ([v1,v2], (map . map) secInt [[10,11], [20,21], [30,31]]) | ^^^^ test/RuntimeTest.hs:23:9: warning: [-Wunused-local-binds] Defined but not used: n1 | 23 | n1 = 5 | ^^ test/RuntimeTest.hs:23:14: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraint Num a0 arising from the literal 5 " In the expression: 5 In an equation for n1: n1 = 5 In the second argument of ($), namely do secInt <- secIntGen 64 let secFld = secFldGen 101 (af, bf) = ... .... runSession $ do out <- await =<< output (fst =<< argmax v1) liftIO $ putStrLn $ "outcome var " ++ show k ++ " : " ++ show out .... | 23 | n1 = 5 | ^ test/RuntimeTest.hs:24:9: warning: [-Wunused-local-binds] Defined but not used: n2 | 24 | n2 = 3 | ^^ test/RuntimeTest.hs:24:14: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraint Num a0 arising from the literal 3 " In the expression: 3 In an equation for n2: n2 = 3 In the second argument of ($), namely do secInt <- secIntGen 64 let secFld = secFldGen 101 (af, bf) = ... .... runSession $ do out <- await =<< output (fst =<< argmax v1) liftIO $ putStrLn $ "outcome var " ++ show k ++ " : " ++ show out .... | 24 | n2 = 3 | ^ test/RuntimeTest.hs:46:47: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraints (Show a0) arising from a use of show at test/RuntimeTest.hs:46:47-50 (Num a0) arising from the literal 11 at test/RuntimeTest.hs:25:13-14 " In the first argument of (++), namely show k In the second argument of (++), namely show k ++ " : " ++ show out In the second argument of ($), namely "outcome var " ++ show k ++ " : " ++ show out | 46 | liftIO $ putStrLn $ "outcome var " ++ show k ++ " : " ++ show out | ^^^^ test/RuntimeTest.hs:49:1: warning: [GHC-38417] [-Wmissing-signatures] Top-level binding with no type signature: tests :: Test | 49 | tests = TestList | ^^^^^ [3 of 4] Compiling ShamirTest ( test/ShamirTest.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/test-hMPC-tmp/ShamirTest.o ) test/ShamirTest.hs:7:1: warning: [-Wunused-imports] The import of Shamir is redundant except perhaps to import instances from Shamir To import instances alone, use: import Shamir() | 7 | import Shamir | ^^^^^^^^^^^^^ test/ShamirTest.hs:10:1: warning: [GHC-38417] [-Wmissing-signatures] Top-level binding with no type signature: secretsharing :: IO () | 10 | secretsharing = do | ^^^^^^^^^^^^^ test/ShamirTest.hs:11:9: warning: [-Wunused-local-binds] Defined but not used: field | 11 | let field = gf 19 | ^^^^^ test/ShamirTest.hs:12:11: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraints (Enum a0) arising from the arithmetic sequence 0 .. 7 at test/ShamirTest.hs:12:11-16 (Num a0) arising from the literal 0 at test/ShamirTest.hs:12:12 " In the first argument of forM_, namely [0 .. 7] In the first argument of ($), namely forM_ [0 .. 7] In a stmt of a 'do' block: forM_ [0 .. 7] $ \ t -> do g <- newStdGen assertEqual "hooi" [...] [...] | 12 | forM_ [0..7] $ \t -> do | ^^^^^^ test/ShamirTest.hs:12:21: warning: [-Wunused-matches] Defined but not used: t | 12 | forM_ [0..7] $ \t -> do | ^ test/ShamirTest.hs:13:7: warning: [-Wunused-matches] Defined but not used: g | 13 | g <- newStdGen | ^ test/ShamirTest.hs:20:7: warning: [GHC-18042] [-Wtype-defaults] " Defaulting the type variable a0 to type Integer in the following constraints (Eq a0) arising from a use of assertEqual at test/ShamirTest.hs:20:7-17 (Show a0) arising from a use of assertEqual at test/ShamirTest.hs:20:7-17 (Num a0) arising from the literal 1 at test/ShamirTest.hs:20:27 " In a stmt of a 'do' block: assertEqual "hooi" [1] [1] In the expression: do g <- newStdGen assertEqual "hooi" [1] [1] In the second argument of ($), namely \ t -> do g <- newStdGen assertEqual "hooi" [...] [...] | 20 | assertEqual "hooi" [1] [1] | ^^^^^^^^^^^ test/ShamirTest.hs:24:1: warning: [GHC-38417] [-Wmissing-signatures] Top-level binding with no type signature: tests :: Test | 24 | tests = TestList | ^^^^^ [4 of 4] Compiling Main ( test/TestMain.hs, /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/test-hMPC-tmp/Main.o ) test/TestMain.hs:9:3: warning: [GHC-81995] [-Wunused-do-bind] A do-notation statement discarded a result of type Counts Suggested fix: Suppress this warning by saying _ <- runTestTT allTests | 9 | runTestTT allTests | ^^^^^^^^^^^^^^^^^^ [5 of 5] Linking /home/builder/builder-dir/build-cache/tmp-install/dist-newstyle/build/x86_64-linux/ghc-9.6.3/hMPC-0.1.0.2/noopt/build/test-hMPC/test-hMPC Running 1 test suites... Test suite test-hMPC: RUNNING... Test suite test-hMPC: PASS Test suite logged to: /home/builder/builder-dir/build-cache/tmp-install/reports/hMPC-0.1.0.2.test Writing: hMPC-0.1.0.2-inplace/FinFields.hs.html Writing: hMPC-0.1.0.2-inplace/Shamir.hs.html Writing: hMPC-0.1.0.2-inplace/Hgmp.hs.html Writing: hMPC-0.1.0.2-inplace/Parser.hs.html Writing: hMPC-0.1.0.2-inplace/Asyncoro.hs.html Writing: hMPC-0.1.0.2-inplace/Types.hs.html Writing: hMPC-0.1.0.2-inplace/SecTypes.hs.html Writing: hMPC-0.1.0.2-inplace/Runtime.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.6.3/hMPC-0.1.0.2/noopt/hpc/vanilla/html/test-hMPC/hpc_index.html 1 of 1 test suites (1 of 1 test cases) passed. Writing: hMPC-0.1.0.2-inplace/FinFields.hs.html Writing: hMPC-0.1.0.2-inplace/Shamir.hs.html Writing: hMPC-0.1.0.2-inplace/Hgmp.hs.html Writing: hMPC-0.1.0.2-inplace/Parser.hs.html Writing: hMPC-0.1.0.2-inplace/Asyncoro.hs.html Writing: hMPC-0.1.0.2-inplace/Types.hs.html Writing: hMPC-0.1.0.2-inplace/SecTypes.hs.html Writing: hMPC-0.1.0.2-inplace/Runtime.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.6.3/hMPC-0.1.0.2/noopt/hpc/vanilla/html/hMPC-0.1.0.2/hpc_index.html