Skip to content

Commit

Permalink
Forgot to send greetings
Browse files Browse the repository at this point in the history
  • Loading branch information
noonio committed Nov 21, 2024
1 parent e3559f1 commit 2276869
Showing 1 changed file with 3 additions and 3 deletions.
6 changes: 3 additions & 3 deletions hydra-node/src/Hydra/API/WSServer.hs
Original file line number Diff line number Diff line change
Expand Up @@ -3,11 +3,11 @@

module Hydra.API.WSServer where

import Hydra.Prelude hiding (TVar, readTVar, seq)
import Hydra.Prelude hiding (TVar, seq)

import Control.Concurrent.STM (TChan, dupTChan, readTChan)
import Control.Concurrent.STM qualified as STM
import Control.Concurrent.STM.TVar (TVar, readTVar)
import Control.Concurrent.STM.TVar (TVar)
import Data.Aeson qualified as Aeson
import Data.Version (showVersion)
import Hydra.API.APIServerLog (APIServerLog (..))
Expand Down Expand Up @@ -42,7 +42,6 @@ import Network.WebSockets (
acceptRequest,
receiveData,
sendTextData,
sendTextDatas,
withPingThread,
)
import Text.URI hiding (ParseException)
Expand Down Expand Up @@ -80,6 +79,7 @@ wsApp party tracer nextSeq callback headStatusP headIdP snapshotUtxoP responseCh
-- forwardHistory con outConfig

-- forwardGreetingOnly con
sendGreetings con

withPingThread con 30 (pure ()) $
race_ (receiveInputs con) (sendOutputs chan con outConfig)
Expand Down

0 comments on commit 2276869

Please sign in to comment.