Skip to content

Commit

Permalink
Updated ouroboros-network
Browse files Browse the repository at this point in the history
  • Loading branch information
coot committed Oct 14, 2022
1 parent 3f74f50 commit e6a29e6
Show file tree
Hide file tree
Showing 3 changed files with 8 additions and 3 deletions.
4 changes: 2 additions & 2 deletions cabal.project
Original file line number Diff line number Diff line change
Expand Up @@ -263,8 +263,8 @@ source-repository-package
source-repository-package
type: git
location: https://github.com/input-output-hk/ouroboros-network
tag: c764553561bed8978d2c6753d1608dc65449617a
--sha256: 0hdh7xdrvxw943r6qr0xr4kwszindh5mnsn1lww6qdnxnmn7wcsc
tag: 5f9a3d3bc84479494258045010dc9e043cc49790
--sha256: 188h1dzk8p0sj46b2r2kyqyll5gvnaxva2cls3cnvcq9jbpx74l8
subdir:
monoidal-synchronisation
network-mux
Expand Down
5 changes: 5 additions & 0 deletions cardano-node/src/Cardano/Tracing/OrphanInstances/Network.hs
Original file line number Diff line number Diff line change
@@ -1,12 +1,14 @@
{-# LANGUAGE DataKinds #-}
{-# LANGUAGE FlexibleContexts #-}
{-# LANGUAGE FlexibleInstances #-}
{-# LANGUAGE GeneralisedNewtypeDeriving #-}
{-# LANGUAGE MultiParamTypeClasses #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE PolyKinds #-}
{-# LANGUAGE QuantifiedConstraints #-}
{-# LANGUAGE ScopedTypeVariables #-}
{-# LANGUAGE StandaloneDeriving #-}
{-# LANGUAGE TypeApplications #-}
{-# LANGUAGE TypeFamilies #-}
{-# LANGUAGE UndecidableInstances #-}
Expand Down Expand Up @@ -63,6 +65,7 @@ import Ouroboros.Network.InboundGovernor (InboundGovernorTrace (..), R
import qualified Ouroboros.Network.InboundGovernor as InboundGovernor
import Ouroboros.Network.InboundGovernor.State (InboundGovernorCounters (..))
import Ouroboros.Network.KeepAlive (TraceKeepAliveClient (..))
import Ouroboros.Network.ExitPolicy (ReconnectDelay (..))
import Ouroboros.Network.Magic (NetworkMagic (..))
import Ouroboros.Network.NodeToClient (NodeToClientVersion, NodeToClientVersionData (..))
import qualified Ouroboros.Network.NodeToClient as NtC
Expand Down Expand Up @@ -1992,6 +1995,8 @@ instance ToJSON RemoteSt where

instance ToJSON addr => Aeson.ToJSONKey (ConnectionId addr) where

deriving instance ToJSON ReconnectDelay

instance ToObject NtN.RemoteAddress where
toObject _verb (SockAddrInet port addr) =
let ip = IP.fromHostAddress addr in
Expand Down
2 changes: 1 addition & 1 deletion cardano-node/src/Cardano/Tracing/Tracers.hs
Original file line number Diff line number Diff line change
Expand Up @@ -1423,7 +1423,7 @@ tracePeerSelectionCountersMetrics (OnOff False) _ = nullTracer
tracePeerSelectionCountersMetrics (OnOff True) (Just ekgDirect) = pscTracer
where
pscTracer :: Tracer IO PeerSelectionCounters
pscTracer = Tracer $ \(PeerSelectionCounters cold warm hot) -> do
pscTracer = Tracer $ \(PeerSelectionCounters cold warm hot _localRoots) -> do
sendEKGDirectInt ekgDirect "cardano.node.metrics.peerSelection.cold" cold
sendEKGDirectInt ekgDirect "cardano.node.metrics.peerSelection.warm" warm
sendEKGDirectInt ekgDirect "cardano.node.metrics.peerSelection.hot" hot
Expand Down

0 comments on commit e6a29e6

Please sign in to comment.