wizard-wipeout/src-server/Server/Communication.hs

187 lines
5.4 KiB
Haskell
Raw Normal View History

2023-12-10 01:02:09 +00:00
{-# LANGUAGE OverloadedStrings #-}
2023-12-09 12:58:59 +00:00
module Server.Communication where
import Control.Concurrent
import qualified Control.Concurrent.STM as STM
2023-12-09 12:58:59 +00:00
import Control.Monad
2023-12-10 01:02:09 +00:00
import Control.Monad.IO.Class
import Control.Monad.RWS.Strict
2023-12-10 16:00:50 +00:00
import qualified Data.Aeson as A
import qualified Data.ByteString as B
2023-12-11 06:07:09 +00:00
import qualified Data.ByteString.Lazy.Char8 as B8
2023-12-10 16:00:50 +00:00
2023-12-11 08:49:24 +00:00
import Data.List
import Data.Maybe
2023-12-11 09:48:25 +00:00
import Data.UUID
2023-12-10 16:00:50 +00:00
import Data.UUID.V4
2023-12-11 06:07:09 +00:00
import qualified Data.Vector.Storable as VS
import Foreign hiding (void)
2023-12-10 01:02:09 +00:00
import Network.Socket as Net
2023-12-09 12:58:59 +00:00
import System.Posix.Signals
-- internal imports
2023-12-10 16:00:50 +00:00
import Library.Types
2023-12-10 01:02:09 +00:00
import Server.Types
2023-12-09 12:58:59 +00:00
import Server.Util
2023-12-09 13:18:10 +00:00
-- | Function which determines whether the given filePath is a supported socket path and
-- subsequently creates a socket in said location.
bindSocket
:: FilePath -- ^ File Path for socket to be created (e.g.: "/tmp/wizard.sock")
-> IO Socket -- ^ resulting Socket
2023-12-09 12:58:59 +00:00
bindSocket path = do
let sockAddr = SockAddrUnix path
unless (isSupportedSockAddr sockAddr)
(error $ "invalid socket path " <> path)
2023-12-09 13:18:10 +00:00
-- aremoveIfExists path
2023-12-10 01:02:09 +00:00
sock <- socket AF_UNIX Stream defaultProtocol
2023-12-09 12:58:59 +00:00
bind sock sockAddr
2023-12-10 01:02:09 +00:00
Net.listen sock 5
2023-12-09 12:58:59 +00:00
pure sock
-- | Function that installs a handler on SIGINT to terminate game
terminateGameOnSigint
:: Game ()
terminateGameOnSigint = do
sock <- asks rcMainSocket
clients <- liftIO . STM.atomically . STM.readTMVar =<< gets scClientSockets
serverState <- gets scServerState
void $ liftIO $ installHandler
2023-12-09 12:58:59 +00:00
keyboardSignal
(CatchOnce $ do
void $ STM.atomically $ STM.swapTMVar serverState (ServerState False True)
disconnectClients clients
threadDelay (10 ^ 6)
2023-12-09 12:58:59 +00:00
(SockAddrUnix path) <- getSocketName sock
2023-12-10 19:12:53 +00:00
close sock
2023-12-09 12:58:59 +00:00
removeIfExists path
2023-12-09 13:11:37 +00:00
-- Raise SIGINT again so it does not get blocked
2023-12-09 12:58:59 +00:00
raiseSignal keyboardSignal
)
Nothing
where
disconnectClients = mapM_
2023-12-11 08:49:24 +00:00
(\(_, clientSocket) -> do
2023-12-11 09:48:25 +00:00
sendMessage ServerQuit clientSocket
2023-12-10 19:12:53 +00:00
close clientSocket
)
2023-12-10 01:02:09 +00:00
-- | Process incoming connection requests
processRequests :: Game ()
2023-12-10 01:02:09 +00:00
processRequests = do
mainSocket <- asks rcMainSocket
socketList <- gets scClientSockets
2023-12-10 08:53:56 +00:00
void $ liftIO $ forkIO $ acceptConnection mainSocket socketList
where
2023-12-10 08:53:56 +00:00
acceptConnection mainSocket socketList = do
2023-12-10 19:12:53 +00:00
putStrLn "accepting new connections…"
2023-12-10 08:53:56 +00:00
(clientSock, _) <- accept mainSocket
liftIO $ STM.atomically $ do
list <- STM.takeTMVar socketList
2023-12-11 08:49:24 +00:00
STM.putTMVar socketList ((Nothing, clientSock) : list)
putStrLn "accepted new connection"
2023-12-10 08:53:56 +00:00
acceptConnection mainSocket socketList
2023-12-10 01:02:09 +00:00
2023-12-10 16:00:50 +00:00
-- | Sends a specified message through given socket to the client
sendMessage
:: ServerMessage
-> Socket
-> IO ()
sendMessage msg sock = do
let msgJson = A.encode msg
2023-12-11 06:07:09 +00:00
msgVector = VS.fromList $ B.unpack $ B.toStrict msgJson
VS.unsafeWith
msgVector
(\ptr -> void $ sendBuf sock ptr (VS.length msgVector))
2023-12-10 16:00:50 +00:00
-- | process incoming messages from clients
processMessages :: Game ()
2023-12-10 01:02:09 +00:00
processMessages = do
clientsVar <- gets scClientSockets
2023-12-10 08:53:56 +00:00
clients <- liftIO $ STM.atomically $ STM.readTMVar clientsVar
2023-12-11 09:48:25 +00:00
queue <- gets scMessageQueue
2023-12-10 19:12:53 +00:00
mapM_
2023-12-11 09:48:25 +00:00
(\(uuid, clientSocket) -> void $ liftIO $ forkIO $ do
receiveMessage clientSocket queue
handleMessage queue clientsVar
2023-12-10 01:02:09 +00:00
)
clients
2023-12-10 19:12:53 +00:00
2023-12-11 06:07:09 +00:00
-- | receive a 'ClientMessage'
2023-12-10 19:12:53 +00:00
receiveMessage
:: Socket
2023-12-11 09:48:25 +00:00
-> STM.TQueue ClientMessage
-> IO ()
receiveMessage sock queue = do
2023-12-11 06:07:09 +00:00
let maxBufferLength = 4096
2023-12-11 09:48:25 +00:00
mmsg <- do
2023-12-11 08:49:24 +00:00
ptr <- mallocArray maxBufferLength
bufferLength <- recvBuf sock ptr maxBufferLength
2023-12-11 06:07:09 +00:00
msg <- B.pack <$> peekArray bufferLength ptr
2023-12-11 08:49:24 +00:00
let mJsonMsg = A.decode' $ B8.fromStrict msg :: Maybe ClientMessage
2023-12-11 06:07:09 +00:00
free ptr
2023-12-11 08:49:24 +00:00
if bufferLength > 0
then
pure mJsonMsg
else
pure Nothing
maybe
(pure ())
(\msg -> do
liftIO $ STM.atomically $ STM.writeTQueue queue msg
)
mmsg
-- | function for translating 'ClientMessage's into server actions
handleMessage
2023-12-11 09:48:25 +00:00
:: STM.TQueue ClientMessage
-> STM.TMVar [(Maybe UUID, Socket)]
-> IO ()
handleMessage queue clientList = do
2023-12-11 08:49:24 +00:00
msgs <- liftIO $ STM.atomically $ STM.flushTQueue queue
clients <- liftIO $ STM.atomically $ STM.readTMVar clientList
mapM_
(\msg -> liftIO $ do
putStrLn "Handling following:"
print msg
case msg of
2023-12-11 09:48:25 +00:00
IdRequest -> do
2023-12-11 08:49:24 +00:00
clientId <- nextRandom
let clientIdx = findIndex (\a -> fst a == Nothing) clients
let clientSock = snd $ clients !! fromJust clientIdx
sendMessage (AcceptClient clientId) clientSock
putStrLn $ "Accepted Client with UUID " <> show clientId
let newClients = map
(\old@(muuid, oldClientSock) ->
if oldClientSock == clientSock && muuid == Nothing
then
(Just clientId, clientSock)
else
old
)
clients
void $ liftIO $ STM.atomically $ STM.swapTMVar clientList newClients
2023-12-11 09:48:25 +00:00
ClientMessage clientId payload ->
case payload of
ClientQuit -> do
putStrLn $ "removing client " <> show clientId
let newClients = filter (\a -> fst a /= Just clientId) clients
void $ liftIO $ STM.atomically $ STM.swapTMVar clientList newClients
_ -> pure ()
2023-12-11 08:49:24 +00:00
)
msgs