Skip to content

Commit abe9fe6

Browse files
cleanup
1 parent 799ca85 commit abe9fe6

File tree

3 files changed

+5
-14
lines changed

3 files changed

+5
-14
lines changed

dmq-node/app/Main.hs

Lines changed: 2 additions & 2 deletions
Original file line numberDiff line numberDiff line change
@@ -126,7 +126,7 @@ runDMQ commandLineConfig = do
126126
psRng
127127
mkStakePoolMonitor $ \nodeKernel -> do
128128
dmqDiffusionConfiguration <-
129-
mkDiffusionConfiguration dmqConfig nt (nodeKernel.stakePools.ledgerBigPeersVar)
129+
mkDiffusionConfiguration dmqConfig nt nodeKernel.stakePools.ledgerBigPeersVar
130130

131131
let sigSize :: Sig StandardCrypto -> SizeInBytes
132132
sigSize _ = 0 -- TODO
@@ -168,7 +168,7 @@ runDMQ commandLineConfig = do
168168
(if localHandshakeTracer
169169
then WithEventType "Handshake" >$< tracer
170170
else nullTracer)
171-
$ maybe [] out <$> (tryReadTMVar $ nodeKernel.stakePools.ledgerPeersVar)
171+
$ maybe [] out <$> tryReadTMVar nodeKernel.stakePools.ledgerPeersVar
172172
where
173173
out :: LedgerPeerSnapshot AllLedgerPeers
174174
-> [(PoolStake, NonEmpty LedgerRelayAccessPoint)]

dmq-node/src/DMQ/NodeToNode.hs

Lines changed: 0 additions & 5 deletions
Original file line numberDiff line numberDiff line change
@@ -4,7 +4,6 @@
44
{-# LANGUAGE OverloadedStrings #-}
55
{-# LANGUAGE RankNTypes #-}
66
{-# LANGUAGE ScopedTypeVariables #-}
7-
{-# LANGUAGE TypeOperators #-}
87

98
module DMQ.NodeToNode
109
( RemoteAddress
@@ -148,10 +147,6 @@ data Apps addr m a b =
148147
ntnApps
149148
:: forall crypto m addr idx.
150149
( Crypto crypto
151-
-- , DSIGN.ContextDSIGN (DSIGN crypto) ~ ()
152-
-- , DSIGN.Signable (DSIGN crypto) (OCertSignable crypto)
153-
-- , KES.ContextKES (KES crypto) ~ ()
154-
-- , KES.Signable (KES crypto) BS.ByteString
155150
, Typeable crypto
156151
, Alternative (STM m)
157152
, MonadAsync m

dmq-node/src/DMQ/Protocol/SigSubmission/Type.hs

Lines changed: 3 additions & 7 deletions
Original file line numberDiff line numberDiff line change
@@ -7,7 +7,6 @@
77
{-# LANGUAGE ScopedTypeVariables #-}
88
{-# LANGUAGE StandaloneDeriving #-}
99
{-# LANGUAGE TypeFamilies #-}
10-
{-# LANGUAGE TypeOperators #-}
1110
{-# LANGUAGE UndecidableInstances #-}
1211

1312
module DMQ.Protocol.SigSubmission.Type
@@ -32,7 +31,6 @@ module DMQ.Protocol.SigSubmission.Type
3231
) where
3332

3433
import Data.Aeson
35-
import Data.Bifunctor (first)
3634
import Data.ByteString (ByteString)
3735
import Data.ByteString.Base16 as BS.Base16
3836
import Data.ByteString.Base16.Lazy as LBS.Base16
@@ -42,12 +40,10 @@ import Data.Text.Encoding qualified as Text
4240
import Data.Time.Clock.POSIX (POSIXTime)
4341
import Data.Typeable
4442

45-
import Cardano.Crypto.DSIGN.Class (ContextDSIGN, DSIGNAlgorithm, VerKeyDSIGN)
46-
import Cardano.Crypto.DSIGN.Class qualified as DSIGN
47-
import Cardano.Crypto.KES.Class (KESAlgorithm (..), Signable)
43+
import Cardano.Crypto.DSIGN.Class (DSIGNAlgorithm, VerKeyDSIGN)
44+
import Cardano.Crypto.KES.Class (KESAlgorithm (..))
4845
import Cardano.KESAgent.KES.Crypto as KES
49-
import Cardano.KESAgent.KES.OCert (KESPeriod (..), OCert (..), OCertSignable,
50-
validateOCert)
46+
import Cardano.KESAgent.KES.OCert (KESPeriod (..), OCert (..))
5147

5248
import Ouroboros.Network.Protocol.TxSubmission2.Type as SigSubmission hiding
5349
(TxSubmission2)

0 commit comments

Comments
 (0)