{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE DuplicateRecordFields #-}
{-# LANGUAGE NamedFieldPuns #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE RecordWildCards #-}
{-# LANGUAGE StrictData #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-unused-matches #-}

-- Derived from AWS service descriptions, licensed under Apache 2.0.

-- |
-- Module      : Amazonka.GameLift.Types.GameSession
-- Copyright   : (c) 2013-2023 Brendan Hay
-- License     : Mozilla Public License, v. 2.0.
-- Maintainer  : Brendan Hay
-- Stability   : auto-generated
-- Portability : non-portable (GHC extensions)
module Amazonka.GameLift.Types.GameSession where

import qualified Amazonka.Core as Core
import qualified Amazonka.Core.Lens.Internal as Lens
import qualified Amazonka.Data as Data
import Amazonka.GameLift.Types.GameProperty
import Amazonka.GameLift.Types.GameSessionStatus
import Amazonka.GameLift.Types.GameSessionStatusReason
import Amazonka.GameLift.Types.PlayerSessionCreationPolicy
import qualified Amazonka.Prelude as Prelude

-- | Properties describing a game session.
--
-- A game session in ACTIVE status can host players. When a game session
-- ends, its status is set to @TERMINATED@.
--
-- Once the session ends, the game session object is retained for 30 days.
-- This means you can reuse idempotency token values after this time. Game
-- session logs are retained for 14 days.
--
-- <https://docs.aws.amazon.com/gamelift/latest/developerguide/reference-awssdk.html#reference-awssdk-resources-fleets All APIs by task>
--
-- /See:/ 'newGameSession' smart constructor.
data GameSession = GameSession'
  { -- | A time stamp indicating when this data object was created. Format is a
    -- number expressed in Unix time as milliseconds (for example
    -- @\"1469498468.057\"@).
    GameSession -> Maybe POSIX
creationTime :: Prelude.Maybe Data.POSIX,
    -- | A unique identifier for a player. This ID is used to enforce a resource
    -- protection policy (if one exists), that limits the number of game
    -- sessions a player can create.
    GameSession -> Maybe Text
creatorId :: Prelude.Maybe Prelude.Text,
    -- | Number of players currently in the game session.
    GameSession -> Maybe Natural
currentPlayerSessionCount :: Prelude.Maybe Prelude.Natural,
    -- | The DNS identifier assigned to the instance that is running the game
    -- session. Values have the following format:
    --
    -- -   TLS-enabled fleets:
    --     @\<unique identifier>.\<region identifier>.amazongamelift.com@.
    --
    -- -   Non-TLS-enabled fleets:
    --     @ec2-\<unique identifier>.compute.amazonaws.com@. (See
    --     <https://docs.aws.amazon.com/AWSEC2/latest/UserGuide/using-instance-addressing.html#concepts-public-addresses Amazon EC2 Instance IP Addressing>.)
    --
    -- When connecting to a game session that is running on a TLS-enabled
    -- fleet, you must use the DNS name, not the IP address.
    GameSession -> Maybe Text
dnsName :: Prelude.Maybe Prelude.Text,
    -- | The Amazon Resource Name
    -- (<https://docs.aws.amazon.com/AmazonS3/latest/dev/s3-arn-format.html ARN>)
    -- associated with the GameLift fleet that this game session is running on.
    GameSession -> Maybe Text
fleetArn :: Prelude.Maybe Prelude.Text,
    -- | A unique identifier for the fleet that the game session is running on.
    GameSession -> Maybe Text
fleetId :: Prelude.Maybe Prelude.Text,
    -- | A set of custom properties for a game session, formatted as key:value
    -- pairs. These properties are passed to a game server process with a
    -- request to start a new game session (see
    -- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
    GameSession -> Maybe [GameProperty]
gameProperties :: Prelude.Maybe [GameProperty],
    -- | A set of custom game session properties, formatted as a single string
    -- value. This data is passed to a game server process with a request to
    -- start a new game session (see
    -- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
    GameSession -> Maybe Text
gameSessionData :: Prelude.Maybe Prelude.Text,
    -- | A unique identifier for the game session. A game session ARN has the
    -- following format:
    -- @arn:aws:gamelift:\<region>::gamesession\/\<fleet ID>\/\<custom ID string or idempotency token>@.
    GameSession -> Maybe Text
gameSessionId :: Prelude.Maybe Prelude.Text,
    -- | The IP address of the game session. To connect to a GameLift game
    -- server, an app needs both the IP address and port number.
    GameSession -> Maybe Text
ipAddress :: Prelude.Maybe Prelude.Text,
    -- | The fleet location where the game session is running. This value might
    -- specify the fleet\'s home Region or a remote location. Location is
    -- expressed as an Amazon Web Services Region code such as @us-west-2@.
    GameSession -> Maybe Text
location :: Prelude.Maybe Prelude.Text,
    -- | Information about the matchmaking process that was used to create the
    -- game session. It is in JSON syntax, formatted as a string. In addition
    -- the matchmaking configuration used, it contains data on all players
    -- assigned to the match, including player attributes and team assignments.
    -- For more details on matchmaker data, see
    -- <https://docs.aws.amazon.com/gamelift/latest/flexmatchguide/match-server.html#match-server-data Match Data>.
    -- Matchmaker data is useful when requesting match backfills, and is
    -- updated whenever new players are added during a successful backfill (see
    -- <https://docs.aws.amazon.com/gamelift/latest/apireference/API_StartMatchBackfill.html StartMatchBackfill>).
    GameSession -> Maybe Text
matchmakerData :: Prelude.Maybe Prelude.Text,
    -- | The maximum number of players that can be connected simultaneously to
    -- the game session.
    GameSession -> Maybe Natural
maximumPlayerSessionCount :: Prelude.Maybe Prelude.Natural,
    -- | A descriptive label that is associated with a game session. Session
    -- names do not need to be unique.
    GameSession -> Maybe Text
name :: Prelude.Maybe Prelude.Text,
    -- | Indicates whether or not the game session is accepting new players.
    GameSession -> Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy :: Prelude.Maybe PlayerSessionCreationPolicy,
    -- | The port number for the game session. To connect to a GameLift game
    -- server, an app needs both the IP address and port number.
    GameSession -> Maybe Natural
port :: Prelude.Maybe Prelude.Natural,
    -- | Current status of the game session. A game session must have an @ACTIVE@
    -- status to have player sessions.
    GameSession -> Maybe GameSessionStatus
status :: Prelude.Maybe GameSessionStatus,
    -- | Provides additional information about game session status. @INTERRUPTED@
    -- indicates that the game session was hosted on a spot instance that was
    -- reclaimed, causing the active game session to be terminated.
    GameSession -> Maybe GameSessionStatusReason
statusReason :: Prelude.Maybe GameSessionStatusReason,
    -- | A time stamp indicating when this data object was terminated. Format is
    -- a number expressed in Unix time as milliseconds (for example
    -- @\"1469498468.057\"@).
    GameSession -> Maybe POSIX
terminationTime :: Prelude.Maybe Data.POSIX
  }
  deriving (GameSession -> GameSession -> Bool
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: GameSession -> GameSession -> Bool
$c/= :: GameSession -> GameSession -> Bool
== :: GameSession -> GameSession -> Bool
$c== :: GameSession -> GameSession -> Bool
Prelude.Eq, ReadPrec [GameSession]
ReadPrec GameSession
Int -> ReadS GameSession
ReadS [GameSession]
forall a.
(Int -> ReadS a)
-> ReadS [a] -> ReadPrec a -> ReadPrec [a] -> Read a
readListPrec :: ReadPrec [GameSession]
$creadListPrec :: ReadPrec [GameSession]
readPrec :: ReadPrec GameSession
$creadPrec :: ReadPrec GameSession
readList :: ReadS [GameSession]
$creadList :: ReadS [GameSession]
readsPrec :: Int -> ReadS GameSession
$creadsPrec :: Int -> ReadS GameSession
Prelude.Read, Int -> GameSession -> ShowS
[GameSession] -> ShowS
GameSession -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [GameSession] -> ShowS
$cshowList :: [GameSession] -> ShowS
show :: GameSession -> String
$cshow :: GameSession -> String
showsPrec :: Int -> GameSession -> ShowS
$cshowsPrec :: Int -> GameSession -> ShowS
Prelude.Show, forall x. Rep GameSession x -> GameSession
forall x. GameSession -> Rep GameSession x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep GameSession x -> GameSession
$cfrom :: forall x. GameSession -> Rep GameSession x
Prelude.Generic)

-- |
-- Create a value of 'GameSession' with all optional fields omitted.
--
-- Use <https://hackage.haskell.org/package/generic-lens generic-lens> or <https://hackage.haskell.org/package/optics optics> to modify other optional fields.
--
-- The following record fields are available, with the corresponding lenses provided
-- for backwards compatibility:
--
-- 'creationTime', 'gameSession_creationTime' - A time stamp indicating when this data object was created. Format is a
-- number expressed in Unix time as milliseconds (for example
-- @\"1469498468.057\"@).
--
-- 'creatorId', 'gameSession_creatorId' - A unique identifier for a player. This ID is used to enforce a resource
-- protection policy (if one exists), that limits the number of game
-- sessions a player can create.
--
-- 'currentPlayerSessionCount', 'gameSession_currentPlayerSessionCount' - Number of players currently in the game session.
--
-- 'dnsName', 'gameSession_dnsName' - The DNS identifier assigned to the instance that is running the game
-- session. Values have the following format:
--
-- -   TLS-enabled fleets:
--     @\<unique identifier>.\<region identifier>.amazongamelift.com@.
--
-- -   Non-TLS-enabled fleets:
--     @ec2-\<unique identifier>.compute.amazonaws.com@. (See
--     <https://docs.aws.amazon.com/AWSEC2/latest/UserGuide/using-instance-addressing.html#concepts-public-addresses Amazon EC2 Instance IP Addressing>.)
--
-- When connecting to a game session that is running on a TLS-enabled
-- fleet, you must use the DNS name, not the IP address.
--
-- 'fleetArn', 'gameSession_fleetArn' - The Amazon Resource Name
-- (<https://docs.aws.amazon.com/AmazonS3/latest/dev/s3-arn-format.html ARN>)
-- associated with the GameLift fleet that this game session is running on.
--
-- 'fleetId', 'gameSession_fleetId' - A unique identifier for the fleet that the game session is running on.
--
-- 'gameProperties', 'gameSession_gameProperties' - A set of custom properties for a game session, formatted as key:value
-- pairs. These properties are passed to a game server process with a
-- request to start a new game session (see
-- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
--
-- 'gameSessionData', 'gameSession_gameSessionData' - A set of custom game session properties, formatted as a single string
-- value. This data is passed to a game server process with a request to
-- start a new game session (see
-- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
--
-- 'gameSessionId', 'gameSession_gameSessionId' - A unique identifier for the game session. A game session ARN has the
-- following format:
-- @arn:aws:gamelift:\<region>::gamesession\/\<fleet ID>\/\<custom ID string or idempotency token>@.
--
-- 'ipAddress', 'gameSession_ipAddress' - The IP address of the game session. To connect to a GameLift game
-- server, an app needs both the IP address and port number.
--
-- 'location', 'gameSession_location' - The fleet location where the game session is running. This value might
-- specify the fleet\'s home Region or a remote location. Location is
-- expressed as an Amazon Web Services Region code such as @us-west-2@.
--
-- 'matchmakerData', 'gameSession_matchmakerData' - Information about the matchmaking process that was used to create the
-- game session. It is in JSON syntax, formatted as a string. In addition
-- the matchmaking configuration used, it contains data on all players
-- assigned to the match, including player attributes and team assignments.
-- For more details on matchmaker data, see
-- <https://docs.aws.amazon.com/gamelift/latest/flexmatchguide/match-server.html#match-server-data Match Data>.
-- Matchmaker data is useful when requesting match backfills, and is
-- updated whenever new players are added during a successful backfill (see
-- <https://docs.aws.amazon.com/gamelift/latest/apireference/API_StartMatchBackfill.html StartMatchBackfill>).
--
-- 'maximumPlayerSessionCount', 'gameSession_maximumPlayerSessionCount' - The maximum number of players that can be connected simultaneously to
-- the game session.
--
-- 'name', 'gameSession_name' - A descriptive label that is associated with a game session. Session
-- names do not need to be unique.
--
-- 'playerSessionCreationPolicy', 'gameSession_playerSessionCreationPolicy' - Indicates whether or not the game session is accepting new players.
--
-- 'port', 'gameSession_port' - The port number for the game session. To connect to a GameLift game
-- server, an app needs both the IP address and port number.
--
-- 'status', 'gameSession_status' - Current status of the game session. A game session must have an @ACTIVE@
-- status to have player sessions.
--
-- 'statusReason', 'gameSession_statusReason' - Provides additional information about game session status. @INTERRUPTED@
-- indicates that the game session was hosted on a spot instance that was
-- reclaimed, causing the active game session to be terminated.
--
-- 'terminationTime', 'gameSession_terminationTime' - A time stamp indicating when this data object was terminated. Format is
-- a number expressed in Unix time as milliseconds (for example
-- @\"1469498468.057\"@).
newGameSession ::
  GameSession
newGameSession :: GameSession
newGameSession =
  GameSession'
    { $sel:creationTime:GameSession' :: Maybe POSIX
creationTime = forall a. Maybe a
Prelude.Nothing,
      $sel:creatorId:GameSession' :: Maybe Text
creatorId = forall a. Maybe a
Prelude.Nothing,
      $sel:currentPlayerSessionCount:GameSession' :: Maybe Natural
currentPlayerSessionCount = forall a. Maybe a
Prelude.Nothing,
      $sel:dnsName:GameSession' :: Maybe Text
dnsName = forall a. Maybe a
Prelude.Nothing,
      $sel:fleetArn:GameSession' :: Maybe Text
fleetArn = forall a. Maybe a
Prelude.Nothing,
      $sel:fleetId:GameSession' :: Maybe Text
fleetId = forall a. Maybe a
Prelude.Nothing,
      $sel:gameProperties:GameSession' :: Maybe [GameProperty]
gameProperties = forall a. Maybe a
Prelude.Nothing,
      $sel:gameSessionData:GameSession' :: Maybe Text
gameSessionData = forall a. Maybe a
Prelude.Nothing,
      $sel:gameSessionId:GameSession' :: Maybe Text
gameSessionId = forall a. Maybe a
Prelude.Nothing,
      $sel:ipAddress:GameSession' :: Maybe Text
ipAddress = forall a. Maybe a
Prelude.Nothing,
      $sel:location:GameSession' :: Maybe Text
location = forall a. Maybe a
Prelude.Nothing,
      $sel:matchmakerData:GameSession' :: Maybe Text
matchmakerData = forall a. Maybe a
Prelude.Nothing,
      $sel:maximumPlayerSessionCount:GameSession' :: Maybe Natural
maximumPlayerSessionCount = forall a. Maybe a
Prelude.Nothing,
      $sel:name:GameSession' :: Maybe Text
name = forall a. Maybe a
Prelude.Nothing,
      $sel:playerSessionCreationPolicy:GameSession' :: Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy = forall a. Maybe a
Prelude.Nothing,
      $sel:port:GameSession' :: Maybe Natural
port = forall a. Maybe a
Prelude.Nothing,
      $sel:status:GameSession' :: Maybe GameSessionStatus
status = forall a. Maybe a
Prelude.Nothing,
      $sel:statusReason:GameSession' :: Maybe GameSessionStatusReason
statusReason = forall a. Maybe a
Prelude.Nothing,
      $sel:terminationTime:GameSession' :: Maybe POSIX
terminationTime = forall a. Maybe a
Prelude.Nothing
    }

-- | A time stamp indicating when this data object was created. Format is a
-- number expressed in Unix time as milliseconds (for example
-- @\"1469498468.057\"@).
gameSession_creationTime :: Lens.Lens' GameSession (Prelude.Maybe Prelude.UTCTime)
gameSession_creationTime :: Lens' GameSession (Maybe UTCTime)
gameSession_creationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe POSIX
creationTime :: Maybe POSIX
$sel:creationTime:GameSession' :: GameSession -> Maybe POSIX
creationTime} -> Maybe POSIX
creationTime) (\s :: GameSession
s@GameSession' {} Maybe POSIX
a -> GameSession
s {$sel:creationTime:GameSession' :: Maybe POSIX
creationTime = Maybe POSIX
a} :: GameSession) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

-- | A unique identifier for a player. This ID is used to enforce a resource
-- protection policy (if one exists), that limits the number of game
-- sessions a player can create.
gameSession_creatorId :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_creatorId :: Lens' GameSession (Maybe Text)
gameSession_creatorId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
creatorId :: Maybe Text
$sel:creatorId:GameSession' :: GameSession -> Maybe Text
creatorId} -> Maybe Text
creatorId) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:creatorId:GameSession' :: Maybe Text
creatorId = Maybe Text
a} :: GameSession)

-- | Number of players currently in the game session.
gameSession_currentPlayerSessionCount :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Natural)
gameSession_currentPlayerSessionCount :: Lens' GameSession (Maybe Natural)
gameSession_currentPlayerSessionCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Natural
currentPlayerSessionCount :: Maybe Natural
$sel:currentPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
currentPlayerSessionCount} -> Maybe Natural
currentPlayerSessionCount) (\s :: GameSession
s@GameSession' {} Maybe Natural
a -> GameSession
s {$sel:currentPlayerSessionCount:GameSession' :: Maybe Natural
currentPlayerSessionCount = Maybe Natural
a} :: GameSession)

-- | The DNS identifier assigned to the instance that is running the game
-- session. Values have the following format:
--
-- -   TLS-enabled fleets:
--     @\<unique identifier>.\<region identifier>.amazongamelift.com@.
--
-- -   Non-TLS-enabled fleets:
--     @ec2-\<unique identifier>.compute.amazonaws.com@. (See
--     <https://docs.aws.amazon.com/AWSEC2/latest/UserGuide/using-instance-addressing.html#concepts-public-addresses Amazon EC2 Instance IP Addressing>.)
--
-- When connecting to a game session that is running on a TLS-enabled
-- fleet, you must use the DNS name, not the IP address.
gameSession_dnsName :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_dnsName :: Lens' GameSession (Maybe Text)
gameSession_dnsName = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
dnsName :: Maybe Text
$sel:dnsName:GameSession' :: GameSession -> Maybe Text
dnsName} -> Maybe Text
dnsName) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:dnsName:GameSession' :: Maybe Text
dnsName = Maybe Text
a} :: GameSession)

-- | The Amazon Resource Name
-- (<https://docs.aws.amazon.com/AmazonS3/latest/dev/s3-arn-format.html ARN>)
-- associated with the GameLift fleet that this game session is running on.
gameSession_fleetArn :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_fleetArn :: Lens' GameSession (Maybe Text)
gameSession_fleetArn = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
fleetArn :: Maybe Text
$sel:fleetArn:GameSession' :: GameSession -> Maybe Text
fleetArn} -> Maybe Text
fleetArn) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:fleetArn:GameSession' :: Maybe Text
fleetArn = Maybe Text
a} :: GameSession)

-- | A unique identifier for the fleet that the game session is running on.
gameSession_fleetId :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_fleetId :: Lens' GameSession (Maybe Text)
gameSession_fleetId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
fleetId :: Maybe Text
$sel:fleetId:GameSession' :: GameSession -> Maybe Text
fleetId} -> Maybe Text
fleetId) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:fleetId:GameSession' :: Maybe Text
fleetId = Maybe Text
a} :: GameSession)

-- | A set of custom properties for a game session, formatted as key:value
-- pairs. These properties are passed to a game server process with a
-- request to start a new game session (see
-- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
gameSession_gameProperties :: Lens.Lens' GameSession (Prelude.Maybe [GameProperty])
gameSession_gameProperties :: Lens' GameSession (Maybe [GameProperty])
gameSession_gameProperties = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe [GameProperty]
gameProperties :: Maybe [GameProperty]
$sel:gameProperties:GameSession' :: GameSession -> Maybe [GameProperty]
gameProperties} -> Maybe [GameProperty]
gameProperties) (\s :: GameSession
s@GameSession' {} Maybe [GameProperty]
a -> GameSession
s {$sel:gameProperties:GameSession' :: Maybe [GameProperty]
gameProperties = Maybe [GameProperty]
a} :: GameSession) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall s t a b. (Coercible s a, Coercible t b) => Iso s t a b
Lens.coerced

-- | A set of custom game session properties, formatted as a single string
-- value. This data is passed to a game server process with a request to
-- start a new game session (see
-- <https://docs.aws.amazon.com/gamelift/latest/developerguide/gamelift-sdk-server-api.html#gamelift-sdk-server-startsession Start a Game Session>).
gameSession_gameSessionData :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_gameSessionData :: Lens' GameSession (Maybe Text)
gameSession_gameSessionData = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
gameSessionData :: Maybe Text
$sel:gameSessionData:GameSession' :: GameSession -> Maybe Text
gameSessionData} -> Maybe Text
gameSessionData) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:gameSessionData:GameSession' :: Maybe Text
gameSessionData = Maybe Text
a} :: GameSession)

-- | A unique identifier for the game session. A game session ARN has the
-- following format:
-- @arn:aws:gamelift:\<region>::gamesession\/\<fleet ID>\/\<custom ID string or idempotency token>@.
gameSession_gameSessionId :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_gameSessionId :: Lens' GameSession (Maybe Text)
gameSession_gameSessionId = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
gameSessionId :: Maybe Text
$sel:gameSessionId:GameSession' :: GameSession -> Maybe Text
gameSessionId} -> Maybe Text
gameSessionId) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:gameSessionId:GameSession' :: Maybe Text
gameSessionId = Maybe Text
a} :: GameSession)

-- | The IP address of the game session. To connect to a GameLift game
-- server, an app needs both the IP address and port number.
gameSession_ipAddress :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_ipAddress :: Lens' GameSession (Maybe Text)
gameSession_ipAddress = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
ipAddress :: Maybe Text
$sel:ipAddress:GameSession' :: GameSession -> Maybe Text
ipAddress} -> Maybe Text
ipAddress) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:ipAddress:GameSession' :: Maybe Text
ipAddress = Maybe Text
a} :: GameSession)

-- | The fleet location where the game session is running. This value might
-- specify the fleet\'s home Region or a remote location. Location is
-- expressed as an Amazon Web Services Region code such as @us-west-2@.
gameSession_location :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_location :: Lens' GameSession (Maybe Text)
gameSession_location = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
location :: Maybe Text
$sel:location:GameSession' :: GameSession -> Maybe Text
location} -> Maybe Text
location) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:location:GameSession' :: Maybe Text
location = Maybe Text
a} :: GameSession)

-- | Information about the matchmaking process that was used to create the
-- game session. It is in JSON syntax, formatted as a string. In addition
-- the matchmaking configuration used, it contains data on all players
-- assigned to the match, including player attributes and team assignments.
-- For more details on matchmaker data, see
-- <https://docs.aws.amazon.com/gamelift/latest/flexmatchguide/match-server.html#match-server-data Match Data>.
-- Matchmaker data is useful when requesting match backfills, and is
-- updated whenever new players are added during a successful backfill (see
-- <https://docs.aws.amazon.com/gamelift/latest/apireference/API_StartMatchBackfill.html StartMatchBackfill>).
gameSession_matchmakerData :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_matchmakerData :: Lens' GameSession (Maybe Text)
gameSession_matchmakerData = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
matchmakerData :: Maybe Text
$sel:matchmakerData:GameSession' :: GameSession -> Maybe Text
matchmakerData} -> Maybe Text
matchmakerData) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:matchmakerData:GameSession' :: Maybe Text
matchmakerData = Maybe Text
a} :: GameSession)

-- | The maximum number of players that can be connected simultaneously to
-- the game session.
gameSession_maximumPlayerSessionCount :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Natural)
gameSession_maximumPlayerSessionCount :: Lens' GameSession (Maybe Natural)
gameSession_maximumPlayerSessionCount = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Natural
maximumPlayerSessionCount :: Maybe Natural
$sel:maximumPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
maximumPlayerSessionCount} -> Maybe Natural
maximumPlayerSessionCount) (\s :: GameSession
s@GameSession' {} Maybe Natural
a -> GameSession
s {$sel:maximumPlayerSessionCount:GameSession' :: Maybe Natural
maximumPlayerSessionCount = Maybe Natural
a} :: GameSession)

-- | A descriptive label that is associated with a game session. Session
-- names do not need to be unique.
gameSession_name :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Text)
gameSession_name :: Lens' GameSession (Maybe Text)
gameSession_name = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Text
name :: Maybe Text
$sel:name:GameSession' :: GameSession -> Maybe Text
name} -> Maybe Text
name) (\s :: GameSession
s@GameSession' {} Maybe Text
a -> GameSession
s {$sel:name:GameSession' :: Maybe Text
name = Maybe Text
a} :: GameSession)

-- | Indicates whether or not the game session is accepting new players.
gameSession_playerSessionCreationPolicy :: Lens.Lens' GameSession (Prelude.Maybe PlayerSessionCreationPolicy)
gameSession_playerSessionCreationPolicy :: Lens' GameSession (Maybe PlayerSessionCreationPolicy)
gameSession_playerSessionCreationPolicy = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy :: Maybe PlayerSessionCreationPolicy
$sel:playerSessionCreationPolicy:GameSession' :: GameSession -> Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy} -> Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy) (\s :: GameSession
s@GameSession' {} Maybe PlayerSessionCreationPolicy
a -> GameSession
s {$sel:playerSessionCreationPolicy:GameSession' :: Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy = Maybe PlayerSessionCreationPolicy
a} :: GameSession)

-- | The port number for the game session. To connect to a GameLift game
-- server, an app needs both the IP address and port number.
gameSession_port :: Lens.Lens' GameSession (Prelude.Maybe Prelude.Natural)
gameSession_port :: Lens' GameSession (Maybe Natural)
gameSession_port = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe Natural
port :: Maybe Natural
$sel:port:GameSession' :: GameSession -> Maybe Natural
port} -> Maybe Natural
port) (\s :: GameSession
s@GameSession' {} Maybe Natural
a -> GameSession
s {$sel:port:GameSession' :: Maybe Natural
port = Maybe Natural
a} :: GameSession)

-- | Current status of the game session. A game session must have an @ACTIVE@
-- status to have player sessions.
gameSession_status :: Lens.Lens' GameSession (Prelude.Maybe GameSessionStatus)
gameSession_status :: Lens' GameSession (Maybe GameSessionStatus)
gameSession_status = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe GameSessionStatus
status :: Maybe GameSessionStatus
$sel:status:GameSession' :: GameSession -> Maybe GameSessionStatus
status} -> Maybe GameSessionStatus
status) (\s :: GameSession
s@GameSession' {} Maybe GameSessionStatus
a -> GameSession
s {$sel:status:GameSession' :: Maybe GameSessionStatus
status = Maybe GameSessionStatus
a} :: GameSession)

-- | Provides additional information about game session status. @INTERRUPTED@
-- indicates that the game session was hosted on a spot instance that was
-- reclaimed, causing the active game session to be terminated.
gameSession_statusReason :: Lens.Lens' GameSession (Prelude.Maybe GameSessionStatusReason)
gameSession_statusReason :: Lens' GameSession (Maybe GameSessionStatusReason)
gameSession_statusReason = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe GameSessionStatusReason
statusReason :: Maybe GameSessionStatusReason
$sel:statusReason:GameSession' :: GameSession -> Maybe GameSessionStatusReason
statusReason} -> Maybe GameSessionStatusReason
statusReason) (\s :: GameSession
s@GameSession' {} Maybe GameSessionStatusReason
a -> GameSession
s {$sel:statusReason:GameSession' :: Maybe GameSessionStatusReason
statusReason = Maybe GameSessionStatusReason
a} :: GameSession)

-- | A time stamp indicating when this data object was terminated. Format is
-- a number expressed in Unix time as milliseconds (for example
-- @\"1469498468.057\"@).
gameSession_terminationTime :: Lens.Lens' GameSession (Prelude.Maybe Prelude.UTCTime)
gameSession_terminationTime :: Lens' GameSession (Maybe UTCTime)
gameSession_terminationTime = forall s a b t. (s -> a) -> (s -> b -> t) -> Lens s t a b
Lens.lens (\GameSession' {Maybe POSIX
terminationTime :: Maybe POSIX
$sel:terminationTime:GameSession' :: GameSession -> Maybe POSIX
terminationTime} -> Maybe POSIX
terminationTime) (\s :: GameSession
s@GameSession' {} Maybe POSIX
a -> GameSession
s {$sel:terminationTime:GameSession' :: Maybe POSIX
terminationTime = Maybe POSIX
a} :: GameSession) forall b c a. (b -> c) -> (a -> b) -> a -> c
Prelude.. forall (f :: * -> *) (g :: * -> *) s t a b.
(Functor f, Functor g) =>
AnIso s t a b -> Iso (f s) (g t) (f a) (g b)
Lens.mapping forall (a :: Format). Iso' (Time a) UTCTime
Data._Time

instance Data.FromJSON GameSession where
  parseJSON :: Value -> Parser GameSession
parseJSON =
    forall a. String -> (Object -> Parser a) -> Value -> Parser a
Data.withObject
      String
"GameSession"
      ( \Object
x ->
          Maybe POSIX
-> Maybe Text
-> Maybe Natural
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe [GameProperty]
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Text
-> Maybe Natural
-> Maybe Text
-> Maybe PlayerSessionCreationPolicy
-> Maybe Natural
-> Maybe GameSessionStatus
-> Maybe GameSessionStatusReason
-> Maybe POSIX
-> GameSession
GameSession'
            forall (f :: * -> *) a b. Functor f => (a -> b) -> f a -> f b
Prelude.<$> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"CreationTime")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"CreatorId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"CurrentPlayerSessionCount")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"DnsName")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FleetArn")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"FleetId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"GameProperties" forall a. Parser (Maybe a) -> a -> Parser a
Data..!= forall a. Monoid a => a
Prelude.mempty)
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"GameSessionData")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"GameSessionId")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"IpAddress")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Location")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"MatchmakerData")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"MaximumPlayerSessionCount")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Name")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"PlayerSessionCreationPolicy")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Port")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"Status")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"StatusReason")
            forall (f :: * -> *) a b. Applicative f => f (a -> b) -> f a -> f b
Prelude.<*> (Object
x forall a. FromJSON a => Object -> Key -> Parser (Maybe a)
Data..:? Key
"TerminationTime")
      )

instance Prelude.Hashable GameSession where
  hashWithSalt :: Int -> GameSession -> Int
hashWithSalt Int
_salt GameSession' {Maybe Natural
Maybe [GameProperty]
Maybe Text
Maybe POSIX
Maybe GameSessionStatus
Maybe GameSessionStatusReason
Maybe PlayerSessionCreationPolicy
terminationTime :: Maybe POSIX
statusReason :: Maybe GameSessionStatusReason
status :: Maybe GameSessionStatus
port :: Maybe Natural
playerSessionCreationPolicy :: Maybe PlayerSessionCreationPolicy
name :: Maybe Text
maximumPlayerSessionCount :: Maybe Natural
matchmakerData :: Maybe Text
location :: Maybe Text
ipAddress :: Maybe Text
gameSessionId :: Maybe Text
gameSessionData :: Maybe Text
gameProperties :: Maybe [GameProperty]
fleetId :: Maybe Text
fleetArn :: Maybe Text
dnsName :: Maybe Text
currentPlayerSessionCount :: Maybe Natural
creatorId :: Maybe Text
creationTime :: Maybe POSIX
$sel:terminationTime:GameSession' :: GameSession -> Maybe POSIX
$sel:statusReason:GameSession' :: GameSession -> Maybe GameSessionStatusReason
$sel:status:GameSession' :: GameSession -> Maybe GameSessionStatus
$sel:port:GameSession' :: GameSession -> Maybe Natural
$sel:playerSessionCreationPolicy:GameSession' :: GameSession -> Maybe PlayerSessionCreationPolicy
$sel:name:GameSession' :: GameSession -> Maybe Text
$sel:maximumPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
$sel:matchmakerData:GameSession' :: GameSession -> Maybe Text
$sel:location:GameSession' :: GameSession -> Maybe Text
$sel:ipAddress:GameSession' :: GameSession -> Maybe Text
$sel:gameSessionId:GameSession' :: GameSession -> Maybe Text
$sel:gameSessionData:GameSession' :: GameSession -> Maybe Text
$sel:gameProperties:GameSession' :: GameSession -> Maybe [GameProperty]
$sel:fleetId:GameSession' :: GameSession -> Maybe Text
$sel:fleetArn:GameSession' :: GameSession -> Maybe Text
$sel:dnsName:GameSession' :: GameSession -> Maybe Text
$sel:currentPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
$sel:creatorId:GameSession' :: GameSession -> Maybe Text
$sel:creationTime:GameSession' :: GameSession -> Maybe POSIX
..} =
    Int
_salt
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
creationTime
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
creatorId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
currentPlayerSessionCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
dnsName
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
fleetArn
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
fleetId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe [GameProperty]
gameProperties
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
gameSessionData
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
gameSessionId
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
ipAddress
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
location
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
matchmakerData
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
maximumPlayerSessionCount
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Text
name
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe Natural
port
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe GameSessionStatus
status
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe GameSessionStatusReason
statusReason
      forall a. Hashable a => Int -> a -> Int
`Prelude.hashWithSalt` Maybe POSIX
terminationTime

instance Prelude.NFData GameSession where
  rnf :: GameSession -> ()
rnf GameSession' {Maybe Natural
Maybe [GameProperty]
Maybe Text
Maybe POSIX
Maybe GameSessionStatus
Maybe GameSessionStatusReason
Maybe PlayerSessionCreationPolicy
terminationTime :: Maybe POSIX
statusReason :: Maybe GameSessionStatusReason
status :: Maybe GameSessionStatus
port :: Maybe Natural
playerSessionCreationPolicy :: Maybe PlayerSessionCreationPolicy
name :: Maybe Text
maximumPlayerSessionCount :: Maybe Natural
matchmakerData :: Maybe Text
location :: Maybe Text
ipAddress :: Maybe Text
gameSessionId :: Maybe Text
gameSessionData :: Maybe Text
gameProperties :: Maybe [GameProperty]
fleetId :: Maybe Text
fleetArn :: Maybe Text
dnsName :: Maybe Text
currentPlayerSessionCount :: Maybe Natural
creatorId :: Maybe Text
creationTime :: Maybe POSIX
$sel:terminationTime:GameSession' :: GameSession -> Maybe POSIX
$sel:statusReason:GameSession' :: GameSession -> Maybe GameSessionStatusReason
$sel:status:GameSession' :: GameSession -> Maybe GameSessionStatus
$sel:port:GameSession' :: GameSession -> Maybe Natural
$sel:playerSessionCreationPolicy:GameSession' :: GameSession -> Maybe PlayerSessionCreationPolicy
$sel:name:GameSession' :: GameSession -> Maybe Text
$sel:maximumPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
$sel:matchmakerData:GameSession' :: GameSession -> Maybe Text
$sel:location:GameSession' :: GameSession -> Maybe Text
$sel:ipAddress:GameSession' :: GameSession -> Maybe Text
$sel:gameSessionId:GameSession' :: GameSession -> Maybe Text
$sel:gameSessionData:GameSession' :: GameSession -> Maybe Text
$sel:gameProperties:GameSession' :: GameSession -> Maybe [GameProperty]
$sel:fleetId:GameSession' :: GameSession -> Maybe Text
$sel:fleetArn:GameSession' :: GameSession -> Maybe Text
$sel:dnsName:GameSession' :: GameSession -> Maybe Text
$sel:currentPlayerSessionCount:GameSession' :: GameSession -> Maybe Natural
$sel:creatorId:GameSession' :: GameSession -> Maybe Text
$sel:creationTime:GameSession' :: GameSession -> Maybe POSIX
..} =
    forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
creationTime
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
creatorId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
currentPlayerSessionCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
dnsName
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
fleetArn
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
fleetId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe [GameProperty]
gameProperties
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
gameSessionData
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
gameSessionId
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
ipAddress
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
location
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
matchmakerData
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
maximumPlayerSessionCount
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Text
name
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe PlayerSessionCreationPolicy
playerSessionCreationPolicy
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe Natural
port
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe GameSessionStatus
status
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe GameSessionStatusReason
statusReason
      seq :: forall a b. a -> b -> b
`Prelude.seq` forall a. NFData a => a -> ()
Prelude.rnf Maybe POSIX
terminationTime