Copyright | (c) 2015-2016 Brendan Hay |
---|---|
License | Mozilla Public License, v. 2.0. |
Maintainer | Brendan Hay <brendan.g.hay@gmail.com> |
Stability | auto-generated |
Portability | non-portable (GHC extensions) |
Safe Haskell | None |
Language | Haskell2010 |
- Service Configuration
- OAuth Scopes
- PlayersListCollection
- RoomJoinRequest
- PlayerName
- Snapshot
- Room
- QuestListResponse
- TurnBasedMatch
- TurnBasedMatchData
- ScoresListCollection
- PlayerEvent
- PlayerLeaderboardScore
- Application
- ApplicationCategory
- PlayerScoreListResponse
- NetworkDiagnostics
- TurnBasedMatchTurn
- QuestCriterion
- TurnBasedMatchList
- PeerChannelDiagnostics
- RoomList
- PushToken
- AchievementUpdateResponse
- LeaderboardEntry
- SnapshotListResponse
- PlayerLevel
- AchievementUpdateMultipleResponse
- RoomParticipant
- ApplicationsGetPlatformType
- EventDefinitionListResponse
- Category
- InstanceAndroidDetails
- TurnBasedMatchParticipant
- AchievementDefinitionsListResponse
- PlayerScoreResponse
- AnonymousPlayer
- QuestContribution
- RoomClientAddress
- LeaderboardListResponse
- PlayerScore
- ScoresListWindowCollection
- TurnBasedAutoMatchingCriteria
- SnapshotImage
- RoomStatus
- PlayerLeaderboardScoreListResponse
- InstanceIosDetails
- EventUpdateResponse
- RevisionCheckResponse
- ParticipantResult
- Leaderboard
- MetagameConfig
- CategoryListResponse
- RoomP2PStatus
- TurnBasedMatchModification
- EventDefinition
- RoomModification
- ScoresListWindowTimeSpan
- EventUpdateRequest
- AchievementUnlockResponse
- ScoresGetTimeSpan
- PlayerAchievement
- RoomP2PStatuses
- ImageAsset
- AchievementUpdateMultipleRequest
- RoomAutoMatchStatus
- AchievementUpdateRequest
- ScoresGetIncludeRankType
- LeaderboardScoreRank
- RoomCreateRequest
- PlayerListResponse
- LeaderboardScores
- AchievementDefinition
- TurnBasedMatchCreateRequest
- EventBatchRecordFailure
- TurnBasedMatchResults
- PushTokenIdIos
- RoomLeaveRequest
- Played
- AchievementIncrementResponse
- AchievementRevealResponse
- AchievementSetStepsAtLeastResponse
- PlayerAchievementListResponse
- EventRecordRequest
- RoomAutoMatchingCriteria
- ScoresListTimeSpan
- QuestMilestone
- PeerSessionDiagnostics
- PushTokenId
- EventPeriodUpdate
- TurnBasedMatchSync
- ScoreSubmission
- RoomLeaveDiagnostics
- AggregateStats
- InstanceWebDetails
- TurnBasedMatchRematch
- PlayerExperienceInfo
- GamesAchievementSetStepsAtLeast
- Player
- GamesAchievementIncrement
- Quest
- EventChild
- ApplicationVerifyResponse
- PlayerEventListResponse
- TurnBasedMatchDataRequest
- ProFileSettings
- EventPeriodRange
- MetagameListCategoriesByPlayerCollection
- AchievementsListState
- EventRecordFailure
- PlayerScoreSubmissionList
- Instance
Synopsis
- gamesService :: ServiceConfig
- gamesScope :: Proxy '["https://www.googleapis.com/auth/games"]
- driveAppDataScope :: Proxy '["https://www.googleapis.com/auth/drive.appdata"]
- data PlayersListCollection = PlayedWith
- data RoomJoinRequest
- roomJoinRequest :: RoomJoinRequest
- rjrNetworkDiagnostics :: Lens' RoomJoinRequest (Maybe NetworkDiagnostics)
- rjrKind :: Lens' RoomJoinRequest Text
- rjrClientAddress :: Lens' RoomJoinRequest (Maybe RoomClientAddress)
- rjrCapabilities :: Lens' RoomJoinRequest [Text]
- data PlayerName
- playerName :: PlayerName
- pnGivenName :: Lens' PlayerName (Maybe Text)
- pnFamilyName :: Lens' PlayerName (Maybe Text)
- data Snapshot
- snapshot :: Snapshot
- sLastModifiedMillis :: Lens' Snapshot (Maybe Int64)
- sKind :: Lens' Snapshot Text
- sProgressValue :: Lens' Snapshot (Maybe Int64)
- sUniqueName :: Lens' Snapshot (Maybe Text)
- sCoverImage :: Lens' Snapshot (Maybe SnapshotImage)
- sId :: Lens' Snapshot (Maybe Text)
- sDurationMillis :: Lens' Snapshot (Maybe Int64)
- sTitle :: Lens' Snapshot (Maybe Text)
- sType :: Lens' Snapshot (Maybe Text)
- sDescription :: Lens' Snapshot (Maybe Text)
- sDriveId :: Lens' Snapshot (Maybe Text)
- data Room
- room :: Room
- rStatus :: Lens' Room (Maybe Text)
- rVariant :: Lens' Room (Maybe Int32)
- rKind :: Lens' Room Text
- rAutoMatchingStatus :: Lens' Room (Maybe RoomAutoMatchStatus)
- rCreationDetails :: Lens' Room (Maybe RoomModification)
- rInviterId :: Lens' Room (Maybe Text)
- rLastUpdateDetails :: Lens' Room (Maybe RoomModification)
- rRoomStatusVersion :: Lens' Room (Maybe Int32)
- rParticipants :: Lens' Room [RoomParticipant]
- rApplicationId :: Lens' Room (Maybe Text)
- rAutoMatchingCriteria :: Lens' Room (Maybe RoomAutoMatchingCriteria)
- rRoomId :: Lens' Room (Maybe Text)
- rDescription :: Lens' Room (Maybe Text)
- data QuestListResponse
- questListResponse :: QuestListResponse
- qlrNextPageToken :: Lens' QuestListResponse (Maybe Text)
- qlrKind :: Lens' QuestListResponse Text
- qlrItems :: Lens' QuestListResponse [Quest]
- data TurnBasedMatch
- turnBasedMatch :: TurnBasedMatch
- tbmStatus :: Lens' TurnBasedMatch (Maybe Text)
- tbmVariant :: Lens' TurnBasedMatch (Maybe Int32)
- tbmResults :: Lens' TurnBasedMatch [ParticipantResult]
- tbmMatchNumber :: Lens' TurnBasedMatch (Maybe Int32)
- tbmKind :: Lens' TurnBasedMatch Text
- tbmData :: Lens' TurnBasedMatch (Maybe TurnBasedMatchData)
- tbmWithParticipantId :: Lens' TurnBasedMatch (Maybe Text)
- tbmCreationDetails :: Lens' TurnBasedMatch (Maybe TurnBasedMatchModification)
- tbmInviterId :: Lens' TurnBasedMatch (Maybe Text)
- tbmLastUpdateDetails :: Lens' TurnBasedMatch (Maybe TurnBasedMatchModification)
- tbmParticipants :: Lens' TurnBasedMatch [TurnBasedMatchParticipant]
- tbmApplicationId :: Lens' TurnBasedMatch (Maybe Text)
- tbmAutoMatchingCriteria :: Lens' TurnBasedMatch (Maybe TurnBasedAutoMatchingCriteria)
- tbmPreviousMatchData :: Lens' TurnBasedMatch (Maybe TurnBasedMatchData)
- tbmPendingParticipantId :: Lens' TurnBasedMatch (Maybe Text)
- tbmUserMatchStatus :: Lens' TurnBasedMatch (Maybe Text)
- tbmMatchId :: Lens' TurnBasedMatch (Maybe Text)
- tbmDescription :: Lens' TurnBasedMatch (Maybe Text)
- tbmRematchId :: Lens' TurnBasedMatch (Maybe Text)
- tbmMatchVersion :: Lens' TurnBasedMatch (Maybe Int32)
- data TurnBasedMatchData
- turnBasedMatchData :: TurnBasedMatchData
- tbmdKind :: Lens' TurnBasedMatchData Text
- tbmdData :: Lens' TurnBasedMatchData (Maybe ByteString)
- tbmdDataAvailable :: Lens' TurnBasedMatchData (Maybe Bool)
- data ScoresListCollection
- data PlayerEvent
- playerEvent :: PlayerEvent
- peKind :: Lens' PlayerEvent Text
- peNumEvents :: Lens' PlayerEvent (Maybe Int64)
- peFormattedNumEvents :: Lens' PlayerEvent (Maybe Text)
- peDefinitionId :: Lens' PlayerEvent (Maybe Text)
- pePlayerId :: Lens' PlayerEvent (Maybe Text)
- data PlayerLeaderboardScore
- playerLeaderboardScore :: PlayerLeaderboardScore
- plsScoreTag :: Lens' PlayerLeaderboardScore (Maybe Text)
- plsScoreString :: Lens' PlayerLeaderboardScore (Maybe Text)
- plsKind :: Lens' PlayerLeaderboardScore Text
- plsScoreValue :: Lens' PlayerLeaderboardScore (Maybe Int64)
- plsTimeSpan :: Lens' PlayerLeaderboardScore (Maybe Text)
- plsPublicRank :: Lens' PlayerLeaderboardScore (Maybe LeaderboardScoreRank)
- plsSocialRank :: Lens' PlayerLeaderboardScore (Maybe LeaderboardScoreRank)
- plsLeaderboardId :: Lens' PlayerLeaderboardScore (Maybe Text)
- plsWriteTimestamp :: Lens' PlayerLeaderboardScore (Maybe Int64)
- data Application
- application :: Application
- aThemeColor :: Lens' Application (Maybe Text)
- aLeaderboardCount :: Lens' Application (Maybe Int32)
- aKind :: Lens' Application Text
- aCategory :: Lens' Application (Maybe ApplicationCategory)
- aName :: Lens' Application (Maybe Text)
- aEnabledFeatures :: Lens' Application [Text]
- aInstances :: Lens' Application [Instance]
- aAuthor :: Lens' Application (Maybe Text)
- aId :: Lens' Application (Maybe Text)
- aAchievementCount :: Lens' Application (Maybe Int32)
- aAssets :: Lens' Application [ImageAsset]
- aDescription :: Lens' Application (Maybe Text)
- aLastUpdatedTimestamp :: Lens' Application (Maybe Int64)
- data ApplicationCategory
- applicationCategory :: ApplicationCategory
- acSecondary :: Lens' ApplicationCategory (Maybe Text)
- acKind :: Lens' ApplicationCategory Text
- acPrimary :: Lens' ApplicationCategory (Maybe Text)
- data PlayerScoreListResponse
- playerScoreListResponse :: PlayerScoreListResponse
- pslrSubmittedScores :: Lens' PlayerScoreListResponse [PlayerScoreResponse]
- pslrKind :: Lens' PlayerScoreListResponse Text
- data NetworkDiagnostics
- networkDiagnostics :: NetworkDiagnostics
- ndAndroidNetworkType :: Lens' NetworkDiagnostics (Maybe Int32)
- ndKind :: Lens' NetworkDiagnostics Text
- ndNetworkOperatorCode :: Lens' NetworkDiagnostics (Maybe Text)
- ndNetworkOperatorName :: Lens' NetworkDiagnostics (Maybe Text)
- ndRegistrationLatencyMillis :: Lens' NetworkDiagnostics (Maybe Int32)
- ndIosNetworkType :: Lens' NetworkDiagnostics (Maybe Int32)
- ndAndroidNetworkSubtype :: Lens' NetworkDiagnostics (Maybe Int32)
- data TurnBasedMatchTurn
- turnBasedMatchTurn :: TurnBasedMatchTurn
- tbmtResults :: Lens' TurnBasedMatchTurn [ParticipantResult]
- tbmtKind :: Lens' TurnBasedMatchTurn Text
- tbmtData :: Lens' TurnBasedMatchTurn (Maybe TurnBasedMatchDataRequest)
- tbmtPendingParticipantId :: Lens' TurnBasedMatchTurn (Maybe Text)
- tbmtMatchVersion :: Lens' TurnBasedMatchTurn (Maybe Int32)
- data QuestCriterion
- questCriterion :: QuestCriterion
- qcCurrentContribution :: Lens' QuestCriterion (Maybe QuestContribution)
- qcCompletionContribution :: Lens' QuestCriterion (Maybe QuestContribution)
- qcKind :: Lens' QuestCriterion Text
- qcInitialPlayerProgress :: Lens' QuestCriterion (Maybe QuestContribution)
- qcEventId :: Lens' QuestCriterion (Maybe Text)
- data TurnBasedMatchList
- turnBasedMatchList :: TurnBasedMatchList
- tbmlNextPageToken :: Lens' TurnBasedMatchList (Maybe Text)
- tbmlKind :: Lens' TurnBasedMatchList Text
- tbmlItems :: Lens' TurnBasedMatchList [TurnBasedMatch]
- data PeerChannelDiagnostics
- peerChannelDiagnostics :: PeerChannelDiagnostics
- pcdNumMessagesLost :: Lens' PeerChannelDiagnostics (Maybe Int32)
- pcdBytesSent :: Lens' PeerChannelDiagnostics (Maybe AggregateStats)
- pcdKind :: Lens' PeerChannelDiagnostics Text
- pcdRoundtripLatencyMillis :: Lens' PeerChannelDiagnostics (Maybe AggregateStats)
- pcdBytesReceived :: Lens' PeerChannelDiagnostics (Maybe AggregateStats)
- pcdNumMessagesReceived :: Lens' PeerChannelDiagnostics (Maybe Int32)
- pcdNumSendFailures :: Lens' PeerChannelDiagnostics (Maybe Int32)
- pcdNumMessagesSent :: Lens' PeerChannelDiagnostics (Maybe Int32)
- data RoomList
- roomList :: RoomList
- rlNextPageToken :: Lens' RoomList (Maybe Text)
- rlKind :: Lens' RoomList Text
- rlItems :: Lens' RoomList [Room]
- data PushToken
- pushToken :: PushToken
- ptClientRevision :: Lens' PushToken (Maybe Text)
- ptKind :: Lens' PushToken Text
- ptLanguage :: Lens' PushToken (Maybe Text)
- ptId :: Lens' PushToken (Maybe PushTokenId)
- data AchievementUpdateResponse
- achievementUpdateResponse :: AchievementUpdateResponse
- aurUpdateOccurred :: Lens' AchievementUpdateResponse (Maybe Bool)
- aurAchievementId :: Lens' AchievementUpdateResponse (Maybe Text)
- aurKind :: Lens' AchievementUpdateResponse Text
- aurCurrentState :: Lens' AchievementUpdateResponse (Maybe Text)
- aurNewlyUnlocked :: Lens' AchievementUpdateResponse (Maybe Bool)
- aurCurrentSteps :: Lens' AchievementUpdateResponse (Maybe Int32)
- data LeaderboardEntry
- leaderboardEntry :: LeaderboardEntry
- leScoreTag :: Lens' LeaderboardEntry (Maybe Text)
- leWriteTimestampMillis :: Lens' LeaderboardEntry (Maybe Int64)
- leKind :: Lens' LeaderboardEntry Text
- leScoreValue :: Lens' LeaderboardEntry (Maybe Int64)
- leFormattedScore :: Lens' LeaderboardEntry (Maybe Text)
- leTimeSpan :: Lens' LeaderboardEntry (Maybe Text)
- leFormattedScoreRank :: Lens' LeaderboardEntry (Maybe Text)
- lePlayer :: Lens' LeaderboardEntry (Maybe Player)
- leScoreRank :: Lens' LeaderboardEntry (Maybe Int64)
- data SnapshotListResponse
- snapshotListResponse :: SnapshotListResponse
- slrNextPageToken :: Lens' SnapshotListResponse (Maybe Text)
- slrKind :: Lens' SnapshotListResponse Text
- slrItems :: Lens' SnapshotListResponse [Snapshot]
- data PlayerLevel
- playerLevel :: PlayerLevel
- plMaxExperiencePoints :: Lens' PlayerLevel (Maybe Int64)
- plKind :: Lens' PlayerLevel Text
- plMinExperiencePoints :: Lens' PlayerLevel (Maybe Int64)
- plLevel :: Lens' PlayerLevel (Maybe Int32)
- data AchievementUpdateMultipleResponse
- achievementUpdateMultipleResponse :: AchievementUpdateMultipleResponse
- aumrKind :: Lens' AchievementUpdateMultipleResponse Text
- aumrUpdatedAchievements :: Lens' AchievementUpdateMultipleResponse [AchievementUpdateResponse]
- data RoomParticipant
- roomParticipant :: RoomParticipant
- rpStatus :: Lens' RoomParticipant (Maybe Text)
- rpConnected :: Lens' RoomParticipant (Maybe Bool)
- rpLeaveReason :: Lens' RoomParticipant (Maybe Text)
- rpKind :: Lens' RoomParticipant Text
- rpClientAddress :: Lens' RoomParticipant (Maybe RoomClientAddress)
- rpId :: Lens' RoomParticipant (Maybe Text)
- rpAutoMatched :: Lens' RoomParticipant (Maybe Bool)
- rpPlayer :: Lens' RoomParticipant (Maybe Player)
- rpCapabilities :: Lens' RoomParticipant [Text]
- rpAutoMatchedPlayer :: Lens' RoomParticipant (Maybe AnonymousPlayer)
- data ApplicationsGetPlatformType
- data EventDefinitionListResponse
- eventDefinitionListResponse :: EventDefinitionListResponse
- edlrNextPageToken :: Lens' EventDefinitionListResponse (Maybe Text)
- edlrKind :: Lens' EventDefinitionListResponse Text
- edlrItems :: Lens' EventDefinitionListResponse [EventDefinition]
- data Category
- category :: Category
- cKind :: Lens' Category Text
- cCategory :: Lens' Category (Maybe Text)
- cExperiencePoints :: Lens' Category (Maybe Int64)
- data InstanceAndroidDetails
- instanceAndroidDetails :: InstanceAndroidDetails
- iadPackageName :: Lens' InstanceAndroidDetails (Maybe Text)
- iadPreferred :: Lens' InstanceAndroidDetails (Maybe Bool)
- iadKind :: Lens' InstanceAndroidDetails Text
- iadEnablePiracyCheck :: Lens' InstanceAndroidDetails (Maybe Bool)
- data TurnBasedMatchParticipant
- turnBasedMatchParticipant :: TurnBasedMatchParticipant
- tbmpStatus :: Lens' TurnBasedMatchParticipant (Maybe Text)
- tbmpKind :: Lens' TurnBasedMatchParticipant Text
- tbmpId :: Lens' TurnBasedMatchParticipant (Maybe Text)
- tbmpAutoMatched :: Lens' TurnBasedMatchParticipant (Maybe Bool)
- tbmpPlayer :: Lens' TurnBasedMatchParticipant (Maybe Player)
- tbmpAutoMatchedPlayer :: Lens' TurnBasedMatchParticipant (Maybe AnonymousPlayer)
- data AchievementDefinitionsListResponse
- achievementDefinitionsListResponse :: AchievementDefinitionsListResponse
- adlrNextPageToken :: Lens' AchievementDefinitionsListResponse (Maybe Text)
- adlrKind :: Lens' AchievementDefinitionsListResponse Text
- adlrItems :: Lens' AchievementDefinitionsListResponse [AchievementDefinition]
- data PlayerScoreResponse
- playerScoreResponse :: PlayerScoreResponse
- psrScoreTag :: Lens' PlayerScoreResponse (Maybe Text)
- psrKind :: Lens' PlayerScoreResponse Text
- psrFormattedScore :: Lens' PlayerScoreResponse (Maybe Text)
- psrLeaderboardId :: Lens' PlayerScoreResponse (Maybe Text)
- psrBeatenScoreTimeSpans :: Lens' PlayerScoreResponse [Text]
- psrUnbeatenScores :: Lens' PlayerScoreResponse [PlayerScore]
- data AnonymousPlayer
- anonymousPlayer :: AnonymousPlayer
- apAvatarImageURL :: Lens' AnonymousPlayer (Maybe Text)
- apKind :: Lens' AnonymousPlayer Text
- apDisplayName :: Lens' AnonymousPlayer (Maybe Text)
- data QuestContribution
- questContribution :: QuestContribution
- qKind :: Lens' QuestContribution Text
- qValue :: Lens' QuestContribution (Maybe Int64)
- qFormattedValue :: Lens' QuestContribution (Maybe Text)
- data RoomClientAddress
- roomClientAddress :: RoomClientAddress
- rcaKind :: Lens' RoomClientAddress Text
- rcaXmppAddress :: Lens' RoomClientAddress (Maybe Text)
- data LeaderboardListResponse
- leaderboardListResponse :: LeaderboardListResponse
- llrNextPageToken :: Lens' LeaderboardListResponse (Maybe Text)
- llrKind :: Lens' LeaderboardListResponse Text
- llrItems :: Lens' LeaderboardListResponse [Leaderboard]
- data PlayerScore
- playerScore :: PlayerScore
- psScoreTag :: Lens' PlayerScore (Maybe Text)
- psScore :: Lens' PlayerScore (Maybe Int64)
- psKind :: Lens' PlayerScore Text
- psFormattedScore :: Lens' PlayerScore (Maybe Text)
- psTimeSpan :: Lens' PlayerScore (Maybe Text)
- data ScoresListWindowCollection
- data TurnBasedAutoMatchingCriteria
- turnBasedAutoMatchingCriteria :: TurnBasedAutoMatchingCriteria
- tbamcKind :: Lens' TurnBasedAutoMatchingCriteria Text
- tbamcExclusiveBitmask :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int64)
- tbamcMaxAutoMatchingPlayers :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int32)
- tbamcMinAutoMatchingPlayers :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int32)
- data SnapshotImage
- snapshotImage :: SnapshotImage
- siHeight :: Lens' SnapshotImage (Maybe Int32)
- siKind :: Lens' SnapshotImage Text
- siURL :: Lens' SnapshotImage (Maybe Text)
- siMimeType :: Lens' SnapshotImage (Maybe Text)
- siWidth :: Lens' SnapshotImage (Maybe Int32)
- data RoomStatus
- roomStatus :: RoomStatus
- rsStatus :: Lens' RoomStatus (Maybe Text)
- rsKind :: Lens' RoomStatus Text
- rsAutoMatchingStatus :: Lens' RoomStatus (Maybe RoomAutoMatchStatus)
- rsStatusVersion :: Lens' RoomStatus (Maybe Int32)
- rsParticipants :: Lens' RoomStatus [RoomParticipant]
- rsRoomId :: Lens' RoomStatus (Maybe Text)
- data PlayerLeaderboardScoreListResponse
- playerLeaderboardScoreListResponse :: PlayerLeaderboardScoreListResponse
- plslrNextPageToken :: Lens' PlayerLeaderboardScoreListResponse (Maybe Text)
- plslrKind :: Lens' PlayerLeaderboardScoreListResponse Text
- plslrItems :: Lens' PlayerLeaderboardScoreListResponse [PlayerLeaderboardScore]
- plslrPlayer :: Lens' PlayerLeaderboardScoreListResponse (Maybe Player)
- data InstanceIosDetails
- instanceIosDetails :: InstanceIosDetails
- iidItunesAppId :: Lens' InstanceIosDetails (Maybe Text)
- iidPreferredForIPad :: Lens' InstanceIosDetails (Maybe Bool)
- iidSupportIPhone :: Lens' InstanceIosDetails (Maybe Bool)
- iidKind :: Lens' InstanceIosDetails Text
- iidSupportIPad :: Lens' InstanceIosDetails (Maybe Bool)
- iidPreferredForIPhone :: Lens' InstanceIosDetails (Maybe Bool)
- iidBundleIdentifier :: Lens' InstanceIosDetails (Maybe Text)
- data EventUpdateResponse
- eventUpdateResponse :: EventUpdateResponse
- eurPlayerEvents :: Lens' EventUpdateResponse [PlayerEvent]
- eurBatchFailures :: Lens' EventUpdateResponse [EventBatchRecordFailure]
- eurEventFailures :: Lens' EventUpdateResponse [EventRecordFailure]
- eurKind :: Lens' EventUpdateResponse Text
- data RevisionCheckResponse
- revisionCheckResponse :: RevisionCheckResponse
- rcrAPIVersion :: Lens' RevisionCheckResponse (Maybe Text)
- rcrKind :: Lens' RevisionCheckResponse Text
- rcrRevisionStatus :: Lens' RevisionCheckResponse (Maybe Text)
- data ParticipantResult
- participantResult :: ParticipantResult
- prParticipantId :: Lens' ParticipantResult (Maybe Text)
- prKind :: Lens' ParticipantResult Text
- prResult :: Lens' ParticipantResult (Maybe Text)
- prPlacing :: Lens' ParticipantResult (Maybe Int32)
- data Leaderboard
- leaderboard :: Leaderboard
- lKind :: Lens' Leaderboard Text
- lIsIconURLDefault :: Lens' Leaderboard (Maybe Bool)
- lName :: Lens' Leaderboard (Maybe Text)
- lId :: Lens' Leaderboard (Maybe Text)
- lIconURL :: Lens' Leaderboard (Maybe Text)
- lOrder :: Lens' Leaderboard (Maybe Text)
- data MetagameConfig
- metagameConfig :: MetagameConfig
- mcKind :: Lens' MetagameConfig Text
- mcCurrentVersion :: Lens' MetagameConfig (Maybe Int32)
- mcPlayerLevels :: Lens' MetagameConfig [PlayerLevel]
- data CategoryListResponse
- categoryListResponse :: CategoryListResponse
- clrNextPageToken :: Lens' CategoryListResponse (Maybe Text)
- clrKind :: Lens' CategoryListResponse Text
- clrItems :: Lens' CategoryListResponse [Category]
- data RoomP2PStatus
- roomP2PStatus :: RoomP2PStatus
- rppsStatus :: Lens' RoomP2PStatus (Maybe Text)
- rppsParticipantId :: Lens' RoomP2PStatus (Maybe Text)
- rppsKind :: Lens' RoomP2PStatus Text
- rppsError :: Lens' RoomP2PStatus (Maybe Text)
- rppsErrorReason :: Lens' RoomP2PStatus (Maybe Text)
- rppsConnectionSetupLatencyMillis :: Lens' RoomP2PStatus (Maybe Int32)
- rppsUnreliableRoundtripLatencyMillis :: Lens' RoomP2PStatus (Maybe Int32)
- data TurnBasedMatchModification
- turnBasedMatchModification :: TurnBasedMatchModification
- tbmmParticipantId :: Lens' TurnBasedMatchModification (Maybe Text)
- tbmmKind :: Lens' TurnBasedMatchModification Text
- tbmmModifiedTimestampMillis :: Lens' TurnBasedMatchModification (Maybe Int64)
- data EventDefinition
- eventDefinition :: EventDefinition
- edIsDefaultImageURL :: Lens' EventDefinition (Maybe Bool)
- edKind :: Lens' EventDefinition Text
- edVisibility :: Lens' EventDefinition (Maybe Text)
- edImageURL :: Lens' EventDefinition (Maybe Text)
- edDisplayName :: Lens' EventDefinition (Maybe Text)
- edId :: Lens' EventDefinition (Maybe Text)
- edChildEvents :: Lens' EventDefinition [EventChild]
- edDescription :: Lens' EventDefinition (Maybe Text)
- data RoomModification
- roomModification :: RoomModification
- rmParticipantId :: Lens' RoomModification (Maybe Text)
- rmKind :: Lens' RoomModification Text
- rmModifiedTimestampMillis :: Lens' RoomModification (Maybe Int64)
- data ScoresListWindowTimeSpan
- data EventUpdateRequest
- eventUpdateRequest :: EventUpdateRequest
- eUpdateCount :: Lens' EventUpdateRequest (Maybe Int64)
- eKind :: Lens' EventUpdateRequest Text
- eDefinitionId :: Lens' EventUpdateRequest (Maybe Text)
- data AchievementUnlockResponse
- achievementUnlockResponse :: AchievementUnlockResponse
- achKind :: Lens' AchievementUnlockResponse Text
- achNewlyUnlocked :: Lens' AchievementUnlockResponse (Maybe Bool)
- data ScoresGetTimeSpan
- data PlayerAchievement
- playerAchievement :: PlayerAchievement
- paKind :: Lens' PlayerAchievement Text
- paAchievementState :: Lens' PlayerAchievement (Maybe Text)
- paFormattedCurrentStepsString :: Lens' PlayerAchievement (Maybe Text)
- paExperiencePoints :: Lens' PlayerAchievement (Maybe Int64)
- paId :: Lens' PlayerAchievement (Maybe Text)
- paCurrentSteps :: Lens' PlayerAchievement (Maybe Int32)
- paLastUpdatedTimestamp :: Lens' PlayerAchievement (Maybe Int64)
- data RoomP2PStatuses
- roomP2PStatuses :: RoomP2PStatuses
- rppssKind :: Lens' RoomP2PStatuses Text
- rppssUpdates :: Lens' RoomP2PStatuses [RoomP2PStatus]
- data ImageAsset
- imageAsset :: ImageAsset
- iaHeight :: Lens' ImageAsset (Maybe Int32)
- iaKind :: Lens' ImageAsset Text
- iaURL :: Lens' ImageAsset (Maybe Text)
- iaWidth :: Lens' ImageAsset (Maybe Int32)
- iaName :: Lens' ImageAsset (Maybe Text)
- data AchievementUpdateMultipleRequest
- achievementUpdateMultipleRequest :: AchievementUpdateMultipleRequest
- aumruKind :: Lens' AchievementUpdateMultipleRequest Text
- aumruUpdates :: Lens' AchievementUpdateMultipleRequest [AchievementUpdateRequest]
- data RoomAutoMatchStatus
- roomAutoMatchStatus :: RoomAutoMatchStatus
- ramsKind :: Lens' RoomAutoMatchStatus Text
- ramsWaitEstimateSeconds :: Lens' RoomAutoMatchStatus (Maybe Int32)
- data AchievementUpdateRequest
- achievementUpdateRequest :: AchievementUpdateRequest
- auruAchievementId :: Lens' AchievementUpdateRequest (Maybe Text)
- auruKind :: Lens' AchievementUpdateRequest Text
- auruUpdateType :: Lens' AchievementUpdateRequest (Maybe Text)
- auruSetStepsAtLeastPayload :: Lens' AchievementUpdateRequest (Maybe GamesAchievementSetStepsAtLeast)
- auruIncrementPayload :: Lens' AchievementUpdateRequest (Maybe GamesAchievementIncrement)
- data ScoresGetIncludeRankType
- data LeaderboardScoreRank
- leaderboardScoreRank :: LeaderboardScoreRank
- lsrNumScores :: Lens' LeaderboardScoreRank (Maybe Int64)
- lsrKind :: Lens' LeaderboardScoreRank Text
- lsrFormattedRank :: Lens' LeaderboardScoreRank (Maybe Text)
- lsrFormattedNumScores :: Lens' LeaderboardScoreRank (Maybe Text)
- lsrRank :: Lens' LeaderboardScoreRank (Maybe Int64)
- data RoomCreateRequest
- roomCreateRequest :: RoomCreateRequest
- rooRequestId :: Lens' RoomCreateRequest (Maybe Int64)
- rooVariant :: Lens' RoomCreateRequest (Maybe Int32)
- rooNetworkDiagnostics :: Lens' RoomCreateRequest (Maybe NetworkDiagnostics)
- rooKind :: Lens' RoomCreateRequest Text
- rooInvitedPlayerIds :: Lens' RoomCreateRequest [Text]
- rooClientAddress :: Lens' RoomCreateRequest (Maybe RoomClientAddress)
- rooAutoMatchingCriteria :: Lens' RoomCreateRequest (Maybe RoomAutoMatchingCriteria)
- rooCapabilities :: Lens' RoomCreateRequest [Text]
- data PlayerListResponse
- playerListResponse :: PlayerListResponse
- plrNextPageToken :: Lens' PlayerListResponse (Maybe Text)
- plrKind :: Lens' PlayerListResponse Text
- plrItems :: Lens' PlayerListResponse [Player]
- data LeaderboardScores
- leaderboardScores :: LeaderboardScores
- lsNextPageToken :: Lens' LeaderboardScores (Maybe Text)
- lsNumScores :: Lens' LeaderboardScores (Maybe Int64)
- lsKind :: Lens' LeaderboardScores Text
- lsPlayerScore :: Lens' LeaderboardScores (Maybe LeaderboardEntry)
- lsItems :: Lens' LeaderboardScores [LeaderboardEntry]
- lsPrevPageToken :: Lens' LeaderboardScores (Maybe Text)
- data AchievementDefinition
- achievementDefinition :: AchievementDefinition
- adAchievementType :: Lens' AchievementDefinition (Maybe Text)
- adFormattedTotalSteps :: Lens' AchievementDefinition (Maybe Text)
- adRevealedIconURL :: Lens' AchievementDefinition (Maybe Text)
- adKind :: Lens' AchievementDefinition Text
- adExperiencePoints :: Lens' AchievementDefinition (Maybe Int64)
- adInitialState :: Lens' AchievementDefinition (Maybe Text)
- adName :: Lens' AchievementDefinition (Maybe Text)
- adId :: Lens' AchievementDefinition (Maybe Text)
- adIsUnlockedIconURLDefault :: Lens' AchievementDefinition (Maybe Bool)
- adTotalSteps :: Lens' AchievementDefinition (Maybe Int32)
- adDescription :: Lens' AchievementDefinition (Maybe Text)
- adIsRevealedIconURLDefault :: Lens' AchievementDefinition (Maybe Bool)
- adUnlockedIconURL :: Lens' AchievementDefinition (Maybe Text)
- data TurnBasedMatchCreateRequest
- turnBasedMatchCreateRequest :: TurnBasedMatchCreateRequest
- tbmcrRequestId :: Lens' TurnBasedMatchCreateRequest (Maybe Int64)
- tbmcrVariant :: Lens' TurnBasedMatchCreateRequest (Maybe Int32)
- tbmcrKind :: Lens' TurnBasedMatchCreateRequest Text
- tbmcrInvitedPlayerIds :: Lens' TurnBasedMatchCreateRequest [Text]
- tbmcrAutoMatchingCriteria :: Lens' TurnBasedMatchCreateRequest (Maybe TurnBasedAutoMatchingCriteria)
- data EventBatchRecordFailure
- eventBatchRecordFailure :: EventBatchRecordFailure
- ebrfKind :: Lens' EventBatchRecordFailure Text
- ebrfRange :: Lens' EventBatchRecordFailure (Maybe EventPeriodRange)
- ebrfFailureCause :: Lens' EventBatchRecordFailure (Maybe Text)
- data TurnBasedMatchResults
- turnBasedMatchResults :: TurnBasedMatchResults
- tbmrResults :: Lens' TurnBasedMatchResults [ParticipantResult]
- tbmrKind :: Lens' TurnBasedMatchResults Text
- tbmrData :: Lens' TurnBasedMatchResults (Maybe TurnBasedMatchDataRequest)
- tbmrMatchVersion :: Lens' TurnBasedMatchResults (Maybe Int32)
- data PushTokenIdIos
- pushTokenIdIos :: PushTokenIdIos
- ptiiAPNSDeviceToken :: Lens' PushTokenIdIos (Maybe ByteString)
- ptiiAPNSEnvironment :: Lens' PushTokenIdIos (Maybe Text)
- data RoomLeaveRequest
- roomLeaveRequest :: RoomLeaveRequest
- rlrKind :: Lens' RoomLeaveRequest Text
- rlrReason :: Lens' RoomLeaveRequest (Maybe Text)
- rlrLeaveDiagnostics :: Lens' RoomLeaveRequest (Maybe RoomLeaveDiagnostics)
- data Played
- played :: Played
- pKind :: Lens' Played Text
- pAutoMatched :: Lens' Played (Maybe Bool)
- pTimeMillis :: Lens' Played (Maybe Int64)
- data AchievementIncrementResponse
- achievementIncrementResponse :: AchievementIncrementResponse
- airKind :: Lens' AchievementIncrementResponse Text
- airNewlyUnlocked :: Lens' AchievementIncrementResponse (Maybe Bool)
- airCurrentSteps :: Lens' AchievementIncrementResponse (Maybe Int32)
- data AchievementRevealResponse
- achievementRevealResponse :: AchievementRevealResponse
- arrKind :: Lens' AchievementRevealResponse Text
- arrCurrentState :: Lens' AchievementRevealResponse (Maybe Text)
- data AchievementSetStepsAtLeastResponse
- achievementSetStepsAtLeastResponse :: AchievementSetStepsAtLeastResponse
- assalrKind :: Lens' AchievementSetStepsAtLeastResponse Text
- assalrNewlyUnlocked :: Lens' AchievementSetStepsAtLeastResponse (Maybe Bool)
- assalrCurrentSteps :: Lens' AchievementSetStepsAtLeastResponse (Maybe Int32)
- data PlayerAchievementListResponse
- playerAchievementListResponse :: PlayerAchievementListResponse
- palrNextPageToken :: Lens' PlayerAchievementListResponse (Maybe Text)
- palrKind :: Lens' PlayerAchievementListResponse Text
- palrItems :: Lens' PlayerAchievementListResponse [PlayerAchievement]
- data EventRecordRequest
- eventRecordRequest :: EventRecordRequest
- errRequestId :: Lens' EventRecordRequest (Maybe Int64)
- errKind :: Lens' EventRecordRequest Text
- errCurrentTimeMillis :: Lens' EventRecordRequest (Maybe Int64)
- errTimePeriods :: Lens' EventRecordRequest [EventPeriodUpdate]
- data RoomAutoMatchingCriteria
- roomAutoMatchingCriteria :: RoomAutoMatchingCriteria
- ramcKind :: Lens' RoomAutoMatchingCriteria Text
- ramcExclusiveBitmask :: Lens' RoomAutoMatchingCriteria (Maybe Int64)
- ramcMaxAutoMatchingPlayers :: Lens' RoomAutoMatchingCriteria (Maybe Int32)
- ramcMinAutoMatchingPlayers :: Lens' RoomAutoMatchingCriteria (Maybe Int32)
- data ScoresListTimeSpan
- data QuestMilestone
- questMilestone :: QuestMilestone
- qmState :: Lens' QuestMilestone (Maybe Text)
- qmKind :: Lens' QuestMilestone Text
- qmId :: Lens' QuestMilestone (Maybe Text)
- qmCompletionRewardData :: Lens' QuestMilestone (Maybe ByteString)
- qmCriteria :: Lens' QuestMilestone [QuestCriterion]
- data PeerSessionDiagnostics
- peerSessionDiagnostics :: PeerSessionDiagnostics
- psdConnectedTimestampMillis :: Lens' PeerSessionDiagnostics (Maybe Int64)
- psdParticipantId :: Lens' PeerSessionDiagnostics (Maybe Text)
- psdKind :: Lens' PeerSessionDiagnostics Text
- psdUnreliableChannel :: Lens' PeerSessionDiagnostics (Maybe PeerChannelDiagnostics)
- psdReliableChannel :: Lens' PeerSessionDiagnostics (Maybe PeerChannelDiagnostics)
- data PushTokenId
- pushTokenId :: PushTokenId
- ptiIos :: Lens' PushTokenId (Maybe PushTokenIdIos)
- ptiKind :: Lens' PushTokenId Text
- data EventPeriodUpdate
- eventPeriodUpdate :: EventPeriodUpdate
- epuKind :: Lens' EventPeriodUpdate Text
- epuTimePeriod :: Lens' EventPeriodUpdate (Maybe EventPeriodRange)
- epuUpdates :: Lens' EventPeriodUpdate [EventUpdateRequest]
- data TurnBasedMatchSync
- turnBasedMatchSync :: TurnBasedMatchSync
- tbmsMoreAvailable :: Lens' TurnBasedMatchSync (Maybe Bool)
- tbmsNextPageToken :: Lens' TurnBasedMatchSync (Maybe Text)
- tbmsKind :: Lens' TurnBasedMatchSync Text
- tbmsItems :: Lens' TurnBasedMatchSync [TurnBasedMatch]
- data ScoreSubmission
- scoreSubmission :: ScoreSubmission
- scoSignature :: Lens' ScoreSubmission (Maybe Text)
- scoScoreTag :: Lens' ScoreSubmission (Maybe Text)
- scoScore :: Lens' ScoreSubmission (Maybe Int64)
- scoKind :: Lens' ScoreSubmission Text
- scoLeaderboardId :: Lens' ScoreSubmission (Maybe Text)
- data RoomLeaveDiagnostics
- roomLeaveDiagnostics :: RoomLeaveDiagnostics
- rldPeerSession :: Lens' RoomLeaveDiagnostics [PeerSessionDiagnostics]
- rldAndroidNetworkType :: Lens' RoomLeaveDiagnostics (Maybe Int32)
- rldKind :: Lens' RoomLeaveDiagnostics Text
- rldNetworkOperatorCode :: Lens' RoomLeaveDiagnostics (Maybe Text)
- rldNetworkOperatorName :: Lens' RoomLeaveDiagnostics (Maybe Text)
- rldSocketsUsed :: Lens' RoomLeaveDiagnostics (Maybe Bool)
- rldIosNetworkType :: Lens' RoomLeaveDiagnostics (Maybe Int32)
- rldAndroidNetworkSubtype :: Lens' RoomLeaveDiagnostics (Maybe Int32)
- data AggregateStats
- aggregateStats :: AggregateStats
- asMax :: Lens' AggregateStats (Maybe Int64)
- asKind :: Lens' AggregateStats Text
- asCount :: Lens' AggregateStats (Maybe Int64)
- asMin :: Lens' AggregateStats (Maybe Int64)
- asSum :: Lens' AggregateStats (Maybe Int64)
- data InstanceWebDetails
- instanceWebDetails :: InstanceWebDetails
- iwdPreferred :: Lens' InstanceWebDetails (Maybe Bool)
- iwdKind :: Lens' InstanceWebDetails Text
- iwdLaunchURL :: Lens' InstanceWebDetails (Maybe Text)
- data TurnBasedMatchRematch
- turnBasedMatchRematch :: TurnBasedMatchRematch
- tRematch :: Lens' TurnBasedMatchRematch (Maybe TurnBasedMatch)
- tKind :: Lens' TurnBasedMatchRematch Text
- tPreviousMatch :: Lens' TurnBasedMatchRematch (Maybe TurnBasedMatch)
- data PlayerExperienceInfo
- playerExperienceInfo :: PlayerExperienceInfo
- peiKind :: Lens' PlayerExperienceInfo Text
- peiCurrentExperiencePoints :: Lens' PlayerExperienceInfo (Maybe Int64)
- peiCurrentLevel :: Lens' PlayerExperienceInfo (Maybe PlayerLevel)
- peiNextLevel :: Lens' PlayerExperienceInfo (Maybe PlayerLevel)
- peiLastLevelUpTimestampMillis :: Lens' PlayerExperienceInfo (Maybe Int64)
- data GamesAchievementSetStepsAtLeast
- gamesAchievementSetStepsAtLeast :: GamesAchievementSetStepsAtLeast
- gassalKind :: Lens' GamesAchievementSetStepsAtLeast Text
- gassalSteps :: Lens' GamesAchievementSetStepsAtLeast (Maybe Int32)
- data Player
- player :: Player
- plaBannerURLLandscape :: Lens' Player (Maybe Text)
- plaLastPlayedWith :: Lens' Player (Maybe Played)
- plaAvatarImageURL :: Lens' Player (Maybe Text)
- plaKind :: Lens' Player Text
- plaExperienceInfo :: Lens' Player (Maybe PlayerExperienceInfo)
- plaName :: Lens' Player (Maybe PlayerName)
- plaOriginalPlayerId :: Lens' Player (Maybe Text)
- plaDisplayName :: Lens' Player (Maybe Text)
- plaTitle :: Lens' Player (Maybe Text)
- plaBannerURLPortrait :: Lens' Player (Maybe Text)
- plaPlayerId :: Lens' Player (Maybe Text)
- plaProFileSettings :: Lens' Player (Maybe ProFileSettings)
- data GamesAchievementIncrement
- gamesAchievementIncrement :: GamesAchievementIncrement
- gaiRequestId :: Lens' GamesAchievementIncrement (Maybe Int64)
- gaiKind :: Lens' GamesAchievementIncrement Text
- gaiSteps :: Lens' GamesAchievementIncrement (Maybe Int32)
- data Quest
- quest :: Quest
- queLastUpdatedTimestampMillis :: Lens' Quest (Maybe Int64)
- queBannerURL :: Lens' Quest (Maybe Text)
- queState :: Lens' Quest (Maybe Text)
- queMilestones :: Lens' Quest [QuestMilestone]
- queKind :: Lens' Quest Text
- queApplicationId :: Lens' Quest (Maybe Text)
- queEndTimestampMillis :: Lens' Quest (Maybe Int64)
- queName :: Lens' Quest (Maybe Text)
- queId :: Lens' Quest (Maybe Text)
- queIconURL :: Lens' Quest (Maybe Text)
- queStartTimestampMillis :: Lens' Quest (Maybe Int64)
- queNotifyTimestampMillis :: Lens' Quest (Maybe Int64)
- queDescription :: Lens' Quest (Maybe Text)
- queIsDefaultBannerURL :: Lens' Quest (Maybe Bool)
- queIsDefaultIconURL :: Lens' Quest (Maybe Bool)
- queAcceptedTimestampMillis :: Lens' Quest (Maybe Int64)
- data EventChild
- eventChild :: EventChild
- ecKind :: Lens' EventChild Text
- ecChildId :: Lens' EventChild (Maybe Text)
- data ApplicationVerifyResponse
- applicationVerifyResponse :: ApplicationVerifyResponse
- avrKind :: Lens' ApplicationVerifyResponse Text
- avrAlternatePlayerId :: Lens' ApplicationVerifyResponse (Maybe Text)
- avrPlayerId :: Lens' ApplicationVerifyResponse (Maybe Text)
- data PlayerEventListResponse
- playerEventListResponse :: PlayerEventListResponse
- pelrNextPageToken :: Lens' PlayerEventListResponse (Maybe Text)
- pelrKind :: Lens' PlayerEventListResponse Text
- pelrItems :: Lens' PlayerEventListResponse [PlayerEvent]
- data TurnBasedMatchDataRequest
- turnBasedMatchDataRequest :: TurnBasedMatchDataRequest
- tbmdrKind :: Lens' TurnBasedMatchDataRequest Text
- tbmdrData :: Lens' TurnBasedMatchDataRequest (Maybe ByteString)
- data ProFileSettings
- proFileSettings :: ProFileSettings
- pfsProFileVisible :: Lens' ProFileSettings (Maybe Bool)
- pfsKind :: Lens' ProFileSettings Text
- data EventPeriodRange
- eventPeriodRange :: EventPeriodRange
- eprKind :: Lens' EventPeriodRange Text
- eprPeriodStartMillis :: Lens' EventPeriodRange (Maybe Int64)
- eprPeriodEndMillis :: Lens' EventPeriodRange (Maybe Int64)
- data MetagameListCategoriesByPlayerCollection = All
- data AchievementsListState
- data EventRecordFailure
- eventRecordFailure :: EventRecordFailure
- erfKind :: Lens' EventRecordFailure Text
- erfFailureCause :: Lens' EventRecordFailure (Maybe Text)
- erfEventId :: Lens' EventRecordFailure (Maybe Text)
- data PlayerScoreSubmissionList
- playerScoreSubmissionList :: PlayerScoreSubmissionList
- psslKind :: Lens' PlayerScoreSubmissionList Text
- psslScores :: Lens' PlayerScoreSubmissionList [ScoreSubmission]
- data Instance
- instance' :: Instance
- iAndroidInstance :: Lens' Instance (Maybe InstanceAndroidDetails)
- iKind :: Lens' Instance Text
- iWebInstance :: Lens' Instance (Maybe InstanceWebDetails)
- iIosInstance :: Lens' Instance (Maybe InstanceIosDetails)
- iName :: Lens' Instance (Maybe Text)
- iAcquisitionURI :: Lens' Instance (Maybe Text)
- iPlatformType :: Lens' Instance (Maybe Text)
- iTurnBasedPlay :: Lens' Instance (Maybe Bool)
- iRealtimePlay :: Lens' Instance (Maybe Bool)
Service Configuration
gamesService :: ServiceConfig Source #
Default request referring to version v1
of the Google Play Game Services API. This contains the host and root path used as a starting point for constructing service requests.
OAuth Scopes
gamesScope :: Proxy '["https://www.googleapis.com/auth/games"] Source #
Share your Google+ profile information and view and manage your game activity
driveAppDataScope :: Proxy '["https://www.googleapis.com/auth/drive.appdata"] Source #
View and manage its own configuration data in your Google Drive
PlayersListCollection
data PlayersListCollection Source #
Collection of players being retrieved
PlayedWith |
|
Instances
RoomJoinRequest
data RoomJoinRequest Source #
This is a JSON template for a join room request.
See: roomJoinRequest
smart constructor.
Instances
roomJoinRequest :: RoomJoinRequest Source #
Creates a value of RoomJoinRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rjrNetworkDiagnostics :: Lens' RoomJoinRequest (Maybe NetworkDiagnostics) Source #
Network diagnostics for the client joining the room.
rjrKind :: Lens' RoomJoinRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomJoinRequest.
rjrClientAddress :: Lens' RoomJoinRequest (Maybe RoomClientAddress) Source #
Client address for the player joining the room.
rjrCapabilities :: Lens' RoomJoinRequest [Text] Source #
The capabilities that this client supports for realtime communication.
PlayerName
data PlayerName Source #
An object representation of the individual components of the player's name. For some players, these fields may not be present.
See: playerName
smart constructor.
Instances
playerName :: PlayerName Source #
Creates a value of PlayerName
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pnGivenName :: Lens' PlayerName (Maybe Text) Source #
The given name of this player. In some places, this is known as the first name.
pnFamilyName :: Lens' PlayerName (Maybe Text) Source #
The family name of this player. In some places, this is known as the last name.
Snapshot
This is a JSON template for an snapshot object.
See: snapshot
smart constructor.
Instances
Creates a value of Snapshot
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
sLastModifiedMillis :: Lens' Snapshot (Maybe Int64) Source #
The timestamp (in millis since Unix epoch) of the last modification to this snapshot.
sKind :: Lens' Snapshot Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#snapshot.
sProgressValue :: Lens' Snapshot (Maybe Int64) Source #
The progress value (64-bit integer set by developer) associated with this snapshot.
sUniqueName :: Lens' Snapshot (Maybe Text) Source #
The unique name provided when the snapshot was created.
sCoverImage :: Lens' Snapshot (Maybe SnapshotImage) Source #
The cover image of this snapshot. May be absent if there is no image.
sDurationMillis :: Lens' Snapshot (Maybe Int64) Source #
The duration associated with this snapshot, in millis.
sType :: Lens' Snapshot (Maybe Text) Source #
The type of this snapshot. Possible values are: - "SAVE_GAME" - A snapshot representing a save game.
sDriveId :: Lens' Snapshot (Maybe Text) Source #
The ID of the file underlying this snapshot in the Drive API. Only present if the snapshot is a view on a Drive file and the file is owned by the caller.
Room
This is a JSON template for a room resource object.
See: room
smart constructor.
Instances
Creates a value of Room
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rStatus :: Lens' Room (Maybe Text) Source #
The status of the room. Possible values are: - "ROOM_INVITING" - One or more players have been invited and not responded. - "ROOM_AUTO_MATCHING" - One or more slots need to be filled by auto-matching. - "ROOM_CONNECTING" - Players have joined and are connecting to each other (either before or after auto-matching). - "ROOM_ACTIVE" - All players have joined and connected to each other. - "ROOM_DELETED" - The room should no longer be shown on the client. Returned in sync calls when a player joins a room (as a tombstone), or for rooms where all joined participants have left.
rVariant :: Lens' Room (Maybe Int32) Source #
The variant / mode of the application being played; can be any integer value, or left blank.
rKind :: Lens' Room Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#room.
rAutoMatchingStatus :: Lens' Room (Maybe RoomAutoMatchStatus) Source #
Auto-matching status for this room. Not set if the room is not currently in the auto-matching queue.
rCreationDetails :: Lens' Room (Maybe RoomModification) Source #
Details about the room creation.
rInviterId :: Lens' Room (Maybe Text) Source #
The ID of the participant that invited the user to the room. Not set if the user was not invited to the room.
rLastUpdateDetails :: Lens' Room (Maybe RoomModification) Source #
Details about the last update to the room.
rRoomStatusVersion :: Lens' Room (Maybe Int32) Source #
The version of the room status: an increasing counter, used by the client to ignore out-of-order updates to room status.
rParticipants :: Lens' Room [RoomParticipant] Source #
The participants involved in the room, along with their statuses. Includes participants who have left or declined invitations.
rAutoMatchingCriteria :: Lens' Room (Maybe RoomAutoMatchingCriteria) Source #
Criteria for auto-matching players into this room.
rDescription :: Lens' Room (Maybe Text) Source #
This short description is generated by our servers and worded relative to the player requesting the room. It is intended to be displayed when the room is shown in a list (that is, an invitation to a room.)
QuestListResponse
data QuestListResponse Source #
This is a JSON template for a list of quest objects.
See: questListResponse
smart constructor.
Instances
questListResponse :: QuestListResponse Source #
Creates a value of QuestListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
qlrNextPageToken :: Lens' QuestListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
qlrKind :: Lens' QuestListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#questListResponse.
TurnBasedMatch
data TurnBasedMatch Source #
This is a JSON template for a turn-based match resource object.
See: turnBasedMatch
smart constructor.
Instances
turnBasedMatch :: TurnBasedMatch Source #
Creates a value of TurnBasedMatch
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmStatus :: Lens' TurnBasedMatch (Maybe Text) Source #
The status of the match. Possible values are: - "MATCH_AUTO_MATCHING" - One or more slots need to be filled by auto-matching; the match cannot be established until they are filled. - "MATCH_ACTIVE" - The match has started. - "MATCH_COMPLETE" - The match has finished. - "MATCH_CANCELED" - The match was canceled. - "MATCH_EXPIRED" - The match expired due to inactivity. - "MATCH_DELETED" - The match should no longer be shown on the client. Returned only for tombstones for matches when sync is called.
tbmVariant :: Lens' TurnBasedMatch (Maybe Int32) Source #
The variant / mode of the application being played; can be any integer value, or left blank.
tbmResults :: Lens' TurnBasedMatch [ParticipantResult] Source #
The results reported for this match.
tbmMatchNumber :: Lens' TurnBasedMatch (Maybe Int32) Source #
The number of the match in a chain of rematches. Will be set to 1 for the first match and incremented by 1 for each rematch.
tbmKind :: Lens' TurnBasedMatch Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatch.
tbmData :: Lens' TurnBasedMatch (Maybe TurnBasedMatchData) Source #
The data / game state for this match.
tbmWithParticipantId :: Lens' TurnBasedMatch (Maybe Text) Source #
The ID of another participant in the match that can be used when describing the participants the user is playing with.
tbmCreationDetails :: Lens' TurnBasedMatch (Maybe TurnBasedMatchModification) Source #
Details about the match creation.
tbmInviterId :: Lens' TurnBasedMatch (Maybe Text) Source #
The ID of the participant that invited the user to the match. Not set if the user was not invited to the match.
tbmLastUpdateDetails :: Lens' TurnBasedMatch (Maybe TurnBasedMatchModification) Source #
Details about the last update to the match.
tbmParticipants :: Lens' TurnBasedMatch [TurnBasedMatchParticipant] Source #
The participants involved in the match, along with their statuses. Includes participants who have left or declined invitations.
tbmApplicationId :: Lens' TurnBasedMatch (Maybe Text) Source #
The ID of the application being played.
tbmAutoMatchingCriteria :: Lens' TurnBasedMatch (Maybe TurnBasedAutoMatchingCriteria) Source #
Criteria for auto-matching players into this match.
tbmPreviousMatchData :: Lens' TurnBasedMatch (Maybe TurnBasedMatchData) Source #
The data / game state for the previous match; set for the first turn of rematches only.
tbmPendingParticipantId :: Lens' TurnBasedMatch (Maybe Text) Source #
The ID of the participant that is taking a turn.
tbmUserMatchStatus :: Lens' TurnBasedMatch (Maybe Text) Source #
The status of the current user in the match. Derived from the match type, match status, the user's participant status, and the pending participant for the match. Possible values are: - "USER_INVITED" - The user has been invited to join the match and has not responded yet. - "USER_AWAITING_TURN" - The user is waiting for their turn. - "USER_TURN" - The user has an action to take in the match. - "USER_MATCH_COMPLETED" - The match has ended (it is completed, canceled, or expired.)
tbmMatchId :: Lens' TurnBasedMatch (Maybe Text) Source #
Globally unique ID for a turn-based match.
tbmDescription :: Lens' TurnBasedMatch (Maybe Text) Source #
This short description is generated by our servers based on turn state and is localized and worded relative to the player requesting the match. It is intended to be displayed when the match is shown in a list.
tbmRematchId :: Lens' TurnBasedMatch (Maybe Text) Source #
The ID of a rematch of this match. Only set for completed matches that have been rematched.
tbmMatchVersion :: Lens' TurnBasedMatch (Maybe Int32) Source #
The version of this match: an increasing counter, used to avoid out-of-date updates to the match.
TurnBasedMatchData
data TurnBasedMatchData Source #
This is a JSON template for a turn-based match data object.
See: turnBasedMatchData
smart constructor.
Instances
turnBasedMatchData :: TurnBasedMatchData Source #
Creates a value of TurnBasedMatchData
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmdKind :: Lens' TurnBasedMatchData Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchData.
tbmdData :: Lens' TurnBasedMatchData (Maybe ByteString) Source #
The byte representation of the data (limited to 128 kB), as a Base64-encoded string with the URL_SAFE encoding option.
tbmdDataAvailable :: Lens' TurnBasedMatchData (Maybe Bool) Source #
True if this match has data available but it wasn't returned in a list response; fetching the match individually will retrieve this data.
ScoresListCollection
data ScoresListCollection Source #
The collection of scores you're requesting.
Public |
|
Social |
|
Social1P |
|
Instances
PlayerEvent
data PlayerEvent Source #
This is a JSON template for an event status resource.
See: playerEvent
smart constructor.
Instances
playerEvent :: PlayerEvent Source #
Creates a value of PlayerEvent
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
peKind :: Lens' PlayerEvent Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerEvent.
peNumEvents :: Lens' PlayerEvent (Maybe Int64) Source #
The current number of times this event has occurred.
peFormattedNumEvents :: Lens' PlayerEvent (Maybe Text) Source #
The current number of times this event has occurred, as a string. The formatting of this string depends on the configuration of your event in the Play Games Developer Console.
peDefinitionId :: Lens' PlayerEvent (Maybe Text) Source #
The ID of the event definition.
pePlayerId :: Lens' PlayerEvent (Maybe Text) Source #
The ID of the player.
PlayerLeaderboardScore
data PlayerLeaderboardScore Source #
This is a JSON template for a player leaderboard score object.
See: playerLeaderboardScore
smart constructor.
Instances
playerLeaderboardScore :: PlayerLeaderboardScore Source #
Creates a value of PlayerLeaderboardScore
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
plsScoreTag :: Lens' PlayerLeaderboardScore (Maybe Text) Source #
Additional information about the score. Values must contain no more than 64 URI-safe characters as defined by section 2.3 of RFC 3986.
plsScoreString :: Lens' PlayerLeaderboardScore (Maybe Text) Source #
The formatted value of this score.
plsKind :: Lens' PlayerLeaderboardScore Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerLeaderboardScore.
plsScoreValue :: Lens' PlayerLeaderboardScore (Maybe Int64) Source #
The numerical value of this score.
plsTimeSpan :: Lens' PlayerLeaderboardScore (Maybe Text) Source #
The time span of this score. Possible values are: - "ALL_TIME" - The score is an all-time score. - "WEEKLY" - The score is a weekly score. - "DAILY" - The score is a daily score.
plsPublicRank :: Lens' PlayerLeaderboardScore (Maybe LeaderboardScoreRank) Source #
The public rank of the score in this leaderboard. This object will not be present if the user is not sharing their scores publicly.
plsSocialRank :: Lens' PlayerLeaderboardScore (Maybe LeaderboardScoreRank) Source #
The social rank of the score in this leaderboard.
plsLeaderboardId :: Lens' PlayerLeaderboardScore (Maybe Text) Source #
The ID of the leaderboard this score is in.
plsWriteTimestamp :: Lens' PlayerLeaderboardScore (Maybe Int64) Source #
The timestamp at which this score was recorded, in milliseconds since the epoch in UTC.
Application
data Application Source #
This is a JSON template for the Application resource.
See: application
smart constructor.
Instances
application :: Application Source #
Creates a value of Application
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
aThemeColor :: Lens' Application (Maybe Text) Source #
A hint to the client UI for what color to use as an app-themed color. The color is given as an RGB triplet (e.g. "E0E0E0").
aLeaderboardCount :: Lens' Application (Maybe Int32) Source #
The number of leaderboards visible to the currently authenticated player.
aKind :: Lens' Application Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#application.
aCategory :: Lens' Application (Maybe ApplicationCategory) Source #
The category of the application.
aEnabledFeatures :: Lens' Application [Text] Source #
A list of features that have been enabled for the application. Possible values are: - "SNAPSHOTS" - Snapshots has been enabled
aInstances :: Lens' Application [Instance] Source #
The instances of the application.
aAchievementCount :: Lens' Application (Maybe Int32) Source #
The number of achievements visible to the currently authenticated player.
aAssets :: Lens' Application [ImageAsset] Source #
The assets of the application.
aDescription :: Lens' Application (Maybe Text) Source #
The description of the application.
aLastUpdatedTimestamp :: Lens' Application (Maybe Int64) Source #
The last updated timestamp of the application.
ApplicationCategory
data ApplicationCategory Source #
This is a JSON template for an application category object.
See: applicationCategory
smart constructor.
Instances
applicationCategory :: ApplicationCategory Source #
Creates a value of ApplicationCategory
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
acSecondary :: Lens' ApplicationCategory (Maybe Text) Source #
The secondary category.
acKind :: Lens' ApplicationCategory Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#applicationCategory.
PlayerScoreListResponse
data PlayerScoreListResponse Source #
This is a JSON template for a list of score submission statuses.
See: playerScoreListResponse
smart constructor.
Instances
playerScoreListResponse :: PlayerScoreListResponse Source #
Creates a value of PlayerScoreListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pslrSubmittedScores :: Lens' PlayerScoreListResponse [PlayerScoreResponse] Source #
The score submissions statuses.
pslrKind :: Lens' PlayerScoreListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerScoreListResponse.
NetworkDiagnostics
data NetworkDiagnostics Source #
This is a JSON template for network diagnostics reported for a client.
See: networkDiagnostics
smart constructor.
Instances
networkDiagnostics :: NetworkDiagnostics Source #
Creates a value of NetworkDiagnostics
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ndAndroidNetworkType :: Lens' NetworkDiagnostics (Maybe Int32) Source #
The Android network type.
ndKind :: Lens' NetworkDiagnostics Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#networkDiagnostics.
ndNetworkOperatorCode :: Lens' NetworkDiagnostics (Maybe Text) Source #
The MCC+MNC code for the client's network connection. On Android: http://developer.android.com/reference/android/telephony/TelephonyManager.html#getNetworkOperator() On iOS, see: https://developer.apple.com/library/ios/documentation/NetworkingInternet/Reference/CTCarrier/Reference/Reference.html
ndNetworkOperatorName :: Lens' NetworkDiagnostics (Maybe Text) Source #
The name of the carrier of the client's network connection. On Android: http://developer.android.com/reference/android/telephony/TelephonyManager.html#getNetworkOperatorName() On iOS: https://developer.apple.com/library/ios/documentation/NetworkingInternet/Reference/CTCarrier/Reference/Reference.html#//apple_ref/occ/instp/CTCarrier/carrierName
ndRegistrationLatencyMillis :: Lens' NetworkDiagnostics (Maybe Int32) Source #
The amount of time in milliseconds it took for the client to establish a connection with the XMPP server.
ndIosNetworkType :: Lens' NetworkDiagnostics (Maybe Int32) Source #
iOS network type as defined in Reachability.h.
ndAndroidNetworkSubtype :: Lens' NetworkDiagnostics (Maybe Int32) Source #
The Android network subtype.
TurnBasedMatchTurn
data TurnBasedMatchTurn Source #
This is a JSON template for the object representing a turn.
See: turnBasedMatchTurn
smart constructor.
Instances
turnBasedMatchTurn :: TurnBasedMatchTurn Source #
Creates a value of TurnBasedMatchTurn
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmtResults :: Lens' TurnBasedMatchTurn [ParticipantResult] Source #
The match results for the participants in the match.
tbmtKind :: Lens' TurnBasedMatchTurn Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchTurn.
tbmtData :: Lens' TurnBasedMatchTurn (Maybe TurnBasedMatchDataRequest) Source #
The shared game state data after the turn is over.
tbmtPendingParticipantId :: Lens' TurnBasedMatchTurn (Maybe Text) Source #
The ID of the participant who should take their turn next. May be set to the current player's participant ID to update match state without changing the turn. If not set, the match will wait for other player(s) to join via automatching; this is only valid if automatch criteria is set on the match with remaining slots for automatched players.
tbmtMatchVersion :: Lens' TurnBasedMatchTurn (Maybe Int32) Source #
The version of this match: an increasing counter, used to avoid out-of-date updates to the match.
QuestCriterion
data QuestCriterion Source #
This is a JSON template for a Quest Criterion resource.
See: questCriterion
smart constructor.
Instances
questCriterion :: QuestCriterion Source #
Creates a value of QuestCriterion
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
qcCurrentContribution :: Lens' QuestCriterion (Maybe QuestContribution) Source #
The number of increments the player has made toward the completion count event increments required to complete the quest. This value will not exceed the completion contribution. There will be no currentContribution until the player has accepted the quest.
qcCompletionContribution :: Lens' QuestCriterion (Maybe QuestContribution) Source #
The total number of times the associated event must be incremented for the player to complete this quest.
qcKind :: Lens' QuestCriterion Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#questCriterion.
qcInitialPlayerProgress :: Lens' QuestCriterion (Maybe QuestContribution) Source #
The value of the event associated with this quest at the time that the quest was accepted. This value may change if event increments that took place before the start of quest are uploaded after the quest starts. There will be no initialPlayerProgress until the player has accepted the quest.
qcEventId :: Lens' QuestCriterion (Maybe Text) Source #
The ID of the event the criterion corresponds to.
TurnBasedMatchList
data TurnBasedMatchList Source #
This is a JSON template for a list of turn-based matches.
See: turnBasedMatchList
smart constructor.
Instances
turnBasedMatchList :: TurnBasedMatchList Source #
Creates a value of TurnBasedMatchList
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmlNextPageToken :: Lens' TurnBasedMatchList (Maybe Text) Source #
The pagination token for the next page of results.
tbmlKind :: Lens' TurnBasedMatchList Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchList.
tbmlItems :: Lens' TurnBasedMatchList [TurnBasedMatch] Source #
The matches.
PeerChannelDiagnostics
data PeerChannelDiagnostics Source #
This is a JSON template for peer channel diagnostics.
See: peerChannelDiagnostics
smart constructor.
Instances
peerChannelDiagnostics :: PeerChannelDiagnostics Source #
Creates a value of PeerChannelDiagnostics
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pcdNumMessagesLost :: Lens' PeerChannelDiagnostics (Maybe Int32) Source #
Number of messages lost.
pcdBytesSent :: Lens' PeerChannelDiagnostics (Maybe AggregateStats) Source #
Number of bytes sent.
pcdKind :: Lens' PeerChannelDiagnostics Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#peerChannelDiagnostics.
pcdRoundtripLatencyMillis :: Lens' PeerChannelDiagnostics (Maybe AggregateStats) Source #
Roundtrip latency stats in milliseconds.
pcdBytesReceived :: Lens' PeerChannelDiagnostics (Maybe AggregateStats) Source #
Number of bytes received.
pcdNumMessagesReceived :: Lens' PeerChannelDiagnostics (Maybe Int32) Source #
Number of messages received.
pcdNumSendFailures :: Lens' PeerChannelDiagnostics (Maybe Int32) Source #
Number of send failures.
pcdNumMessagesSent :: Lens' PeerChannelDiagnostics (Maybe Int32) Source #
Number of messages sent.
RoomList
This is a JSON template for a list of rooms.
See: roomList
smart constructor.
Instances
Eq RoomList Source # | |
Data RoomList Source # | |
Defined in Network.Google.Games.Types.Product gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RoomList -> c RoomList # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RoomList # toConstr :: RoomList -> Constr # dataTypeOf :: RoomList -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RoomList) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RoomList) # gmapT :: (forall b. Data b => b -> b) -> RoomList -> RoomList # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RoomList -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RoomList -> r # gmapQ :: (forall d. Data d => d -> u) -> RoomList -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> RoomList -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> RoomList -> m RoomList # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RoomList -> m RoomList # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RoomList -> m RoomList # | |
Show RoomList Source # | |
Generic RoomList Source # | |
ToJSON RoomList Source # | |
Defined in Network.Google.Games.Types.Product | |
FromJSON RoomList Source # | |
type Rep RoomList Source # | |
Defined in Network.Google.Games.Types.Product type Rep RoomList = D1 (MetaData "RoomList" "Network.Google.Games.Types.Product" "gogol-games-0.4.0-EPjClsFfNAGupIHqlLfHm" False) (C1 (MetaCons "RoomList'" PrefixI True) (S1 (MetaSel (Just "_rlNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_rlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: S1 (MetaSel (Just "_rlItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Room]))))) |
Creates a value of RoomList
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rlNextPageToken :: Lens' RoomList (Maybe Text) Source #
The pagination token for the next page of results.
rlKind :: Lens' RoomList Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomList.
PushToken
This is a JSON template for a push token resource.
See: pushToken
smart constructor.
Instances
pushToken :: PushToken Source #
Creates a value of PushToken
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ptClientRevision :: Lens' PushToken (Maybe Text) Source #
The revision of the client SDK used by your application, in the same format that's used by revisions.check. Used to send backward compatible messages. Format: [PLATFORM_TYPE]:[VERSION_NUMBER]. Possible values of PLATFORM_TYPE are: - IOS - Push token is for iOS
ptKind :: Lens' PushToken Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#pushToken.
ptLanguage :: Lens' PushToken (Maybe Text) Source #
The preferred language for notifications that are sent using this token.
AchievementUpdateResponse
data AchievementUpdateResponse Source #
This is a JSON template for an achievement update response.
See: achievementUpdateResponse
smart constructor.
Instances
achievementUpdateResponse :: AchievementUpdateResponse Source #
Creates a value of AchievementUpdateResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
aurUpdateOccurred :: Lens' AchievementUpdateResponse (Maybe Bool) Source #
Whether the requested updates actually affected the achievement.
aurAchievementId :: Lens' AchievementUpdateResponse (Maybe Text) Source #
The achievement this update is was applied to.
aurKind :: Lens' AchievementUpdateResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementUpdateResponse.
aurCurrentState :: Lens' AchievementUpdateResponse (Maybe Text) Source #
The current state of the achievement. Possible values are: - "HIDDEN" - Achievement is hidden. - "REVEALED" - Achievement is revealed. - "UNLOCKED" - Achievement is unlocked.
aurNewlyUnlocked :: Lens' AchievementUpdateResponse (Maybe Bool) Source #
Whether this achievement was newly unlocked (that is, whether the unlock request for the achievement was the first for the player).
aurCurrentSteps :: Lens' AchievementUpdateResponse (Maybe Int32) Source #
The current steps recorded for this achievement if it is incremental.
LeaderboardEntry
data LeaderboardEntry Source #
This is a JSON template for the Leaderboard Entry resource.
See: leaderboardEntry
smart constructor.
Instances
leaderboardEntry :: LeaderboardEntry Source #
Creates a value of LeaderboardEntry
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
leScoreTag :: Lens' LeaderboardEntry (Maybe Text) Source #
Additional information about the score. Values must contain no more than 64 URI-safe characters as defined by section 2.3 of RFC 3986.
leWriteTimestampMillis :: Lens' LeaderboardEntry (Maybe Int64) Source #
The timestamp at which this score was recorded, in milliseconds since the epoch in UTC.
leKind :: Lens' LeaderboardEntry Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#leaderboardEntry.
leScoreValue :: Lens' LeaderboardEntry (Maybe Int64) Source #
The numerical value of this score.
leFormattedScore :: Lens' LeaderboardEntry (Maybe Text) Source #
The localized string for the numerical value of this score.
leTimeSpan :: Lens' LeaderboardEntry (Maybe Text) Source #
The time span of this high score. Possible values are: - "ALL_TIME" - The score is an all-time high score. - "WEEKLY" - The score is a weekly high score. - "DAILY" - The score is a daily high score.
leFormattedScoreRank :: Lens' LeaderboardEntry (Maybe Text) Source #
The localized string for the rank of this score for this leaderboard.
leScoreRank :: Lens' LeaderboardEntry (Maybe Int64) Source #
The rank of this score for this leaderboard.
SnapshotListResponse
data SnapshotListResponse Source #
This is a JSON template for a list of snapshot objects.
See: snapshotListResponse
smart constructor.
Instances
snapshotListResponse :: SnapshotListResponse Source #
Creates a value of SnapshotListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
slrNextPageToken :: Lens' SnapshotListResponse (Maybe Text) Source #
Token corresponding to the next page of results. If there are no more results, the token is omitted.
slrKind :: Lens' SnapshotListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#snapshotListResponse.
PlayerLevel
data PlayerLevel Source #
This is a JSON template for 1P/3P metadata about a user's level.
See: playerLevel
smart constructor.
Instances
playerLevel :: PlayerLevel Source #
Creates a value of PlayerLevel
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
plMaxExperiencePoints :: Lens' PlayerLevel (Maybe Int64) Source #
The maximum experience points for this level.
plKind :: Lens' PlayerLevel Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerLevel.
plMinExperiencePoints :: Lens' PlayerLevel (Maybe Int64) Source #
The minimum experience points for this level.
AchievementUpdateMultipleResponse
data AchievementUpdateMultipleResponse Source #
This is a JSON template for an achievement unlock response.
See: achievementUpdateMultipleResponse
smart constructor.
Instances
achievementUpdateMultipleResponse :: AchievementUpdateMultipleResponse Source #
Creates a value of AchievementUpdateMultipleResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
aumrKind :: Lens' AchievementUpdateMultipleResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementUpdateListResponse.
aumrUpdatedAchievements :: Lens' AchievementUpdateMultipleResponse [AchievementUpdateResponse] Source #
The updated state of the achievements.
RoomParticipant
data RoomParticipant Source #
This is a JSON template for a participant in a room.
See: roomParticipant
smart constructor.
Instances
roomParticipant :: RoomParticipant Source #
Creates a value of RoomParticipant
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rpStatus :: Lens' RoomParticipant (Maybe Text) Source #
The status of the participant with respect to the room. Possible values are: - "PARTICIPANT_INVITED" - The participant has been invited to join the room, but has not yet responded. - "PARTICIPANT_JOINED" - The participant has joined the room (either after creating it or accepting an invitation.) - "PARTICIPANT_DECLINED" - The participant declined an invitation to join the room. - "PARTICIPANT_LEFT" - The participant joined the room and then left it.
rpConnected :: Lens' RoomParticipant (Maybe Bool) Source #
True if this participant is in the fully connected set of peers in the room.
rpLeaveReason :: Lens' RoomParticipant (Maybe Text) Source #
The reason the participant left the room; populated if the participant status is PARTICIPANT_LEFT. Possible values are: - "PLAYER_LEFT" - The player explicitly chose to leave the room. - "GAME_LEFT" - The game chose to remove the player from the room. - "ABANDONED" - The player switched to another application and abandoned the room. - "PEER_CONNECTION_FAILURE" - The client was unable to establish or maintain a connection to other peer(s) in the room. - "SERVER_ERROR" - The client received an error response when it tried to communicate with the server. - "TIMEOUT" - The client timed out while waiting for players to join and connect. - "PRESENCE_FAILURE" - The client's XMPP connection ended abruptly.
rpKind :: Lens' RoomParticipant Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomParticipant.
rpClientAddress :: Lens' RoomParticipant (Maybe RoomClientAddress) Source #
Client address for the participant.
rpId :: Lens' RoomParticipant (Maybe Text) Source #
An identifier for the participant in the scope of the room. Cannot be used to identify a player across rooms or in other contexts.
rpAutoMatched :: Lens' RoomParticipant (Maybe Bool) Source #
True if this participant was auto-matched with the requesting player.
rpPlayer :: Lens' RoomParticipant (Maybe Player) Source #
Information about the player. Not populated if this player was anonymously auto-matched against the requesting player. (Either player or autoMatchedPlayer will be set.)
rpCapabilities :: Lens' RoomParticipant [Text] Source #
The capabilities which can be used when communicating with this participant.
rpAutoMatchedPlayer :: Lens' RoomParticipant (Maybe AnonymousPlayer) Source #
Information about a player that has been anonymously auto-matched against the requesting player. (Either player or autoMatchedPlayer will be set.)
ApplicationsGetPlatformType
data ApplicationsGetPlatformType Source #
Restrict application details returned to the specific platform.
Android |
|
Ios |
|
WebApp |
|
Instances
EventDefinitionListResponse
data EventDefinitionListResponse Source #
This is a JSON template for a ListDefinitions response.
See: eventDefinitionListResponse
smart constructor.
Instances
eventDefinitionListResponse :: EventDefinitionListResponse Source #
Creates a value of EventDefinitionListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
edlrNextPageToken :: Lens' EventDefinitionListResponse (Maybe Text) Source #
The pagination token for the next page of results.
edlrKind :: Lens' EventDefinitionListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventDefinitionListResponse.
edlrItems :: Lens' EventDefinitionListResponse [EventDefinition] Source #
The event definitions.
Category
This is a JSON template for data related to individual game categories.
See: category
smart constructor.
Instances
Eq Category Source # | |
Data Category Source # | |
Defined in Network.Google.Games.Types.Product gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Category -> c Category # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Category # toConstr :: Category -> Constr # dataTypeOf :: Category -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Category) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Category) # gmapT :: (forall b. Data b => b -> b) -> Category -> Category # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Category -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Category -> r # gmapQ :: (forall d. Data d => d -> u) -> Category -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Category -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Category -> m Category # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Category -> m Category # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Category -> m Category # | |
Show Category Source # | |
Generic Category Source # | |
ToJSON Category Source # | |
Defined in Network.Google.Games.Types.Product | |
FromJSON Category Source # | |
type Rep Category Source # | |
Defined in Network.Google.Games.Types.Product type Rep Category = D1 (MetaData "Category" "Network.Google.Games.Types.Product" "gogol-games-0.4.0-EPjClsFfNAGupIHqlLfHm" False) (C1 (MetaCons "Category'" PrefixI True) (S1 (MetaSel (Just "_cKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_cCategory") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cExperiencePoints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) |
Creates a value of Category
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
cKind :: Lens' Category Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#category.
cExperiencePoints :: Lens' Category (Maybe Int64) Source #
Experience points earned in this category.
InstanceAndroidDetails
data InstanceAndroidDetails Source #
This is a JSON template for the Android instance details resource.
See: instanceAndroidDetails
smart constructor.
Instances
instanceAndroidDetails :: InstanceAndroidDetails Source #
Creates a value of InstanceAndroidDetails
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
iadPackageName :: Lens' InstanceAndroidDetails (Maybe Text) Source #
Android package name which maps to Google Play URL.
iadPreferred :: Lens' InstanceAndroidDetails (Maybe Bool) Source #
Indicates that this instance is the default for new installations.
iadKind :: Lens' InstanceAndroidDetails Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#instanceAndroidDetails.
iadEnablePiracyCheck :: Lens' InstanceAndroidDetails (Maybe Bool) Source #
Flag indicating whether the anti-piracy check is enabled.
TurnBasedMatchParticipant
data TurnBasedMatchParticipant Source #
This is a JSON template for a participant in a turn-based match.
See: turnBasedMatchParticipant
smart constructor.
Instances
turnBasedMatchParticipant :: TurnBasedMatchParticipant Source #
Creates a value of TurnBasedMatchParticipant
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmpStatus :: Lens' TurnBasedMatchParticipant (Maybe Text) Source #
The status of the participant with respect to the match. Possible values are: - "PARTICIPANT_NOT_INVITED_YET" - The participant is slated to be invited to the match, but the invitation has not been sent; the invite will be sent when it becomes their turn. - "PARTICIPANT_INVITED" - The participant has been invited to join the match, but has not yet responded. - "PARTICIPANT_JOINED" - The participant has joined the match (either after creating it or accepting an invitation.) - "PARTICIPANT_DECLINED" - The participant declined an invitation to join the match. - "PARTICIPANT_LEFT" - The participant joined the match and then left it. - "PARTICIPANT_FINISHED" - The participant finished playing in the match. - "PARTICIPANT_UNRESPONSIVE" - The participant did not take their turn in the allotted time.
tbmpKind :: Lens' TurnBasedMatchParticipant Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchParticipant.
tbmpId :: Lens' TurnBasedMatchParticipant (Maybe Text) Source #
An identifier for the participant in the scope of the match. Cannot be used to identify a player across matches or in other contexts.
tbmpAutoMatched :: Lens' TurnBasedMatchParticipant (Maybe Bool) Source #
True if this participant was auto-matched with the requesting player.
tbmpPlayer :: Lens' TurnBasedMatchParticipant (Maybe Player) Source #
Information about the player. Not populated if this player was anonymously auto-matched against the requesting player. (Either player or autoMatchedPlayer will be set.)
tbmpAutoMatchedPlayer :: Lens' TurnBasedMatchParticipant (Maybe AnonymousPlayer) Source #
Information about a player that has been anonymously auto-matched against the requesting player. (Either player or autoMatchedPlayer will be set.)
AchievementDefinitionsListResponse
data AchievementDefinitionsListResponse Source #
This is a JSON template for a list of achievement definition objects.
See: achievementDefinitionsListResponse
smart constructor.
Instances
achievementDefinitionsListResponse :: AchievementDefinitionsListResponse Source #
Creates a value of AchievementDefinitionsListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
adlrNextPageToken :: Lens' AchievementDefinitionsListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
adlrKind :: Lens' AchievementDefinitionsListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementDefinitionsListResponse.
adlrItems :: Lens' AchievementDefinitionsListResponse [AchievementDefinition] Source #
The achievement definitions.
PlayerScoreResponse
data PlayerScoreResponse Source #
This is a JSON template for a list of leaderboard entry resources.
See: playerScoreResponse
smart constructor.
Instances
playerScoreResponse :: PlayerScoreResponse Source #
Creates a value of PlayerScoreResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
psrScoreTag :: Lens' PlayerScoreResponse (Maybe Text) Source #
Additional information about this score. Values will contain no more than 64 URI-safe characters as defined by section 2.3 of RFC 3986.
psrKind :: Lens' PlayerScoreResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerScoreResponse.
psrFormattedScore :: Lens' PlayerScoreResponse (Maybe Text) Source #
The formatted value of the submitted score.
psrLeaderboardId :: Lens' PlayerScoreResponse (Maybe Text) Source #
The leaderboard ID that this score was submitted to.
psrBeatenScoreTimeSpans :: Lens' PlayerScoreResponse [Text] Source #
The time spans where the submitted score is better than the existing score for that time span. Possible values are: - "ALL_TIME" - The score is an all-time score. - "WEEKLY" - The score is a weekly score. - "DAILY" - The score is a daily score.
psrUnbeatenScores :: Lens' PlayerScoreResponse [PlayerScore] Source #
The scores in time spans that have not been beaten. As an example, the submitted score may be better than the player's DAILY score, but not better than the player's scores for the WEEKLY or ALL_TIME time spans.
AnonymousPlayer
data AnonymousPlayer Source #
This is a JSON template for an anonymous player
See: anonymousPlayer
smart constructor.
Instances
anonymousPlayer :: AnonymousPlayer Source #
Creates a value of AnonymousPlayer
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
apAvatarImageURL :: Lens' AnonymousPlayer (Maybe Text) Source #
The base URL for the image to display for the anonymous player.
apKind :: Lens' AnonymousPlayer Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#anonymousPlayer.
apDisplayName :: Lens' AnonymousPlayer (Maybe Text) Source #
The name to display for the anonymous player.
QuestContribution
data QuestContribution Source #
This is a JSON template for a Quest Criterion Contribution resource.
See: questContribution
smart constructor.
Instances
questContribution :: QuestContribution Source #
Creates a value of QuestContribution
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
qKind :: Lens' QuestContribution Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#questContribution.
qFormattedValue :: Lens' QuestContribution (Maybe Text) Source #
The formatted value of the contribution as a string. Format depends on the configuration for the associated event definition in the Play Games Developer Console.
RoomClientAddress
data RoomClientAddress Source #
This is a JSON template for the client address when setting up a room.
See: roomClientAddress
smart constructor.
Instances
roomClientAddress :: RoomClientAddress Source #
Creates a value of RoomClientAddress
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rcaKind :: Lens' RoomClientAddress Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomClientAddress.
rcaXmppAddress :: Lens' RoomClientAddress (Maybe Text) Source #
The XMPP address of the client on the Google Games XMPP network.
LeaderboardListResponse
data LeaderboardListResponse Source #
This is a JSON template for a list of leaderboard objects.
See: leaderboardListResponse
smart constructor.
Instances
leaderboardListResponse :: LeaderboardListResponse Source #
Creates a value of LeaderboardListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
llrNextPageToken :: Lens' LeaderboardListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
llrKind :: Lens' LeaderboardListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#leaderboardListResponse.
llrItems :: Lens' LeaderboardListResponse [Leaderboard] Source #
The leaderboards.
PlayerScore
data PlayerScore Source #
This is a JSON template for a player score.
See: playerScore
smart constructor.
Instances
playerScore :: PlayerScore Source #
Creates a value of PlayerScore
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
psScoreTag :: Lens' PlayerScore (Maybe Text) Source #
Additional information about this score. Values will contain no more than 64 URI-safe characters as defined by section 2.3 of RFC 3986.
psKind :: Lens' PlayerScore Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerScore.
psFormattedScore :: Lens' PlayerScore (Maybe Text) Source #
The formatted score for this player score.
psTimeSpan :: Lens' PlayerScore (Maybe Text) Source #
The time span for this player score. Possible values are: - "ALL_TIME" - The score is an all-time score. - "WEEKLY" - The score is a weekly score. - "DAILY" - The score is a daily score.
ScoresListWindowCollection
data ScoresListWindowCollection Source #
The collection of scores you're requesting.
SLWCPublic |
|
SLWCSocial |
|
SLWCSocial1P |
|
Instances
TurnBasedAutoMatchingCriteria
data TurnBasedAutoMatchingCriteria Source #
This is a JSON template for an turn-based auto-match criteria object.
See: turnBasedAutoMatchingCriteria
smart constructor.
Instances
turnBasedAutoMatchingCriteria :: TurnBasedAutoMatchingCriteria Source #
Creates a value of TurnBasedAutoMatchingCriteria
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbamcKind :: Lens' TurnBasedAutoMatchingCriteria Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedAutoMatchingCriteria.
tbamcExclusiveBitmask :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int64) Source #
A bitmask indicating when auto-matches are valid. When ANDed with other exclusive bitmasks, the result must be zero. Can be used to support exclusive roles within a game.
tbamcMaxAutoMatchingPlayers :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int32) Source #
The maximum number of players that should be added to the match by auto-matching.
tbamcMinAutoMatchingPlayers :: Lens' TurnBasedAutoMatchingCriteria (Maybe Int32) Source #
The minimum number of players that should be added to the match by auto-matching.
SnapshotImage
data SnapshotImage Source #
This is a JSON template for an image of a snapshot.
See: snapshotImage
smart constructor.
Instances
snapshotImage :: SnapshotImage Source #
Creates a value of SnapshotImage
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
siKind :: Lens' SnapshotImage Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#snapshotImage.
siURL :: Lens' SnapshotImage (Maybe Text) Source #
The URL of the image. This URL may be invalidated at any time and should not be cached.
siMimeType :: Lens' SnapshotImage (Maybe Text) Source #
The MIME type of the image.
RoomStatus
data RoomStatus Source #
This is a JSON template for the status of a room that the player has joined.
See: roomStatus
smart constructor.
Instances
roomStatus :: RoomStatus Source #
Creates a value of RoomStatus
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rsStatus :: Lens' RoomStatus (Maybe Text) Source #
The status of the room. Possible values are: - "ROOM_INVITING" - One or more players have been invited and not responded. - "ROOM_AUTO_MATCHING" - One or more slots need to be filled by auto-matching. - "ROOM_CONNECTING" - Players have joined are connecting to each other (either before or after auto-matching). - "ROOM_ACTIVE" - All players have joined and connected to each other. - "ROOM_DELETED" - All joined players have left.
rsKind :: Lens' RoomStatus Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomStatus.
rsAutoMatchingStatus :: Lens' RoomStatus (Maybe RoomAutoMatchStatus) Source #
Auto-matching status for this room. Not set if the room is not currently in the automatching queue.
rsStatusVersion :: Lens' RoomStatus (Maybe Int32) Source #
The version of the status for the room: an increasing counter, used by the client to ignore out-of-order updates to room status.
rsParticipants :: Lens' RoomStatus [RoomParticipant] Source #
The participants involved in the room, along with their statuses. Includes participants who have left or declined invitations.
PlayerLeaderboardScoreListResponse
data PlayerLeaderboardScoreListResponse Source #
This is a JSON template for a list of player leaderboard scores.
See: playerLeaderboardScoreListResponse
smart constructor.
Instances
playerLeaderboardScoreListResponse :: PlayerLeaderboardScoreListResponse Source #
Creates a value of PlayerLeaderboardScoreListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
plslrNextPageToken :: Lens' PlayerLeaderboardScoreListResponse (Maybe Text) Source #
The pagination token for the next page of results.
plslrKind :: Lens' PlayerLeaderboardScoreListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerLeaderboardScoreListResponse.
plslrItems :: Lens' PlayerLeaderboardScoreListResponse [PlayerLeaderboardScore] Source #
The leaderboard scores.
plslrPlayer :: Lens' PlayerLeaderboardScoreListResponse (Maybe Player) Source #
The Player resources for the owner of this score.
InstanceIosDetails
data InstanceIosDetails Source #
This is a JSON template for the iOS details resource.
See: instanceIosDetails
smart constructor.
Instances
instanceIosDetails :: InstanceIosDetails Source #
Creates a value of InstanceIosDetails
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
iidItunesAppId :: Lens' InstanceIosDetails (Maybe Text) Source #
iTunes App ID.
iidPreferredForIPad :: Lens' InstanceIosDetails (Maybe Bool) Source #
Indicates that this instance is the default for new installations on iPad devices.
iidSupportIPhone :: Lens' InstanceIosDetails (Maybe Bool) Source #
Flag to indicate if this instance supports iPhone.
iidKind :: Lens' InstanceIosDetails Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#instanceIosDetails.
iidSupportIPad :: Lens' InstanceIosDetails (Maybe Bool) Source #
Flag to indicate if this instance supports iPad.
iidPreferredForIPhone :: Lens' InstanceIosDetails (Maybe Bool) Source #
Indicates that this instance is the default for new installations on iPhone devices.
iidBundleIdentifier :: Lens' InstanceIosDetails (Maybe Text) Source #
Bundle identifier.
EventUpdateResponse
data EventUpdateResponse Source #
This is a JSON template for an event period update resource.
See: eventUpdateResponse
smart constructor.
Instances
eventUpdateResponse :: EventUpdateResponse Source #
Creates a value of EventUpdateResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
eurPlayerEvents :: Lens' EventUpdateResponse [PlayerEvent] Source #
The current status of any updated events
eurBatchFailures :: Lens' EventUpdateResponse [EventBatchRecordFailure] Source #
Any batch-wide failures which occurred applying updates.
eurEventFailures :: Lens' EventUpdateResponse [EventRecordFailure] Source #
Any failures updating a particular event.
eurKind :: Lens' EventUpdateResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventUpdateResponse.
RevisionCheckResponse
data RevisionCheckResponse Source #
This is a JSON template for the result of checking a revision.
See: revisionCheckResponse
smart constructor.
Instances
revisionCheckResponse :: RevisionCheckResponse Source #
Creates a value of RevisionCheckResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rcrAPIVersion :: Lens' RevisionCheckResponse (Maybe Text) Source #
The version of the API this client revision should use when calling API methods.
rcrKind :: Lens' RevisionCheckResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#revisionCheckResponse.
rcrRevisionStatus :: Lens' RevisionCheckResponse (Maybe Text) Source #
The result of the revision check. Possible values are: - "OK" - The revision being used is current. - "DEPRECATED" - There is currently a newer version available, but the revision being used still works. - "INVALID" - The revision being used is not supported in any released version.
ParticipantResult
data ParticipantResult Source #
This is a JSON template for a result for a match participant.
See: participantResult
smart constructor.
Instances
participantResult :: ParticipantResult Source #
Creates a value of ParticipantResult
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
prParticipantId :: Lens' ParticipantResult (Maybe Text) Source #
The ID of the participant.
prKind :: Lens' ParticipantResult Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#participantResult.
prResult :: Lens' ParticipantResult (Maybe Text) Source #
The result of the participant for this match. Possible values are: - "MATCH_RESULT_WIN" - The participant won the match. - "MATCH_RESULT_LOSS" - The participant lost the match. - "MATCH_RESULT_TIE" - The participant tied the match. - "MATCH_RESULT_NONE" - There was no winner for the match (nobody wins or loses this kind of game.) - "MATCH_RESULT_DISCONNECT" - The participant disconnected / left during the match. - "MATCH_RESULT_DISAGREED" - Different clients reported different results for this participant.
prPlacing :: Lens' ParticipantResult (Maybe Int32) Source #
The placement or ranking of the participant in the match results; a number from one to the number of participants in the match. Multiple participants may have the same placing value in case of a type.
Leaderboard
data Leaderboard Source #
This is a JSON template for the Leaderboard resource.
See: leaderboard
smart constructor.
Instances
leaderboard :: Leaderboard Source #
Creates a value of Leaderboard
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
lKind :: Lens' Leaderboard Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#leaderboard.
lIsIconURLDefault :: Lens' Leaderboard (Maybe Bool) Source #
Indicates whether the icon image being returned is a default image, or is game-provided.
lOrder :: Lens' Leaderboard (Maybe Text) Source #
How scores are ordered. Possible values are: - "LARGER_IS_BETTER" - Larger values are better; scores are sorted in descending order. - "SMALLER_IS_BETTER" - Smaller values are better; scores are sorted in ascending order.
MetagameConfig
data MetagameConfig Source #
This is a JSON template for the metagame config resource
See: metagameConfig
smart constructor.
Instances
metagameConfig :: MetagameConfig Source #
Creates a value of MetagameConfig
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
mcKind :: Lens' MetagameConfig Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#metagameConfig.
mcCurrentVersion :: Lens' MetagameConfig (Maybe Int32) Source #
Current version of the metagame configuration data. When this data is updated, the version number will be increased by one.
mcPlayerLevels :: Lens' MetagameConfig [PlayerLevel] Source #
The list of player levels.
CategoryListResponse
data CategoryListResponse Source #
This is a JSON template for a list of category data objects.
See: categoryListResponse
smart constructor.
Instances
categoryListResponse :: CategoryListResponse Source #
Creates a value of CategoryListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
clrNextPageToken :: Lens' CategoryListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
clrKind :: Lens' CategoryListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#categoryListResponse.
RoomP2PStatus
data RoomP2PStatus Source #
This is a JSON template for an update on the status of a peer in a room.
See: roomP2PStatus
smart constructor.
Instances
roomP2PStatus :: RoomP2PStatus Source #
Creates a value of RoomP2PStatus
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rppsStatus :: Lens' RoomP2PStatus (Maybe Text) Source #
The status of the peer in the room. Possible values are: - "CONNECTION_ESTABLISHED" - The client established a P2P connection with the peer. - "CONNECTION_FAILED" - The client failed to establish directed presence with the peer.
rppsParticipantId :: Lens' RoomP2PStatus (Maybe Text) Source #
The ID of the participant.
rppsKind :: Lens' RoomP2PStatus Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomP2PStatus.
rppsError :: Lens' RoomP2PStatus (Maybe Text) Source #
The error code in event of a failure. Possible values are: - "P2P_FAILED" - The client failed to establish a P2P connection with the peer. - "PRESENCE_FAILED" - The client failed to register to receive P2P connections. - "RELAY_SERVER_FAILED" - The client received an error when trying to use the relay server to establish a P2P connection with the peer.
rppsErrorReason :: Lens' RoomP2PStatus (Maybe Text) Source #
More detailed diagnostic message returned in event of a failure.
rppsConnectionSetupLatencyMillis :: Lens' RoomP2PStatus (Maybe Int32) Source #
The amount of time in milliseconds it took to establish connections with this peer.
rppsUnreliableRoundtripLatencyMillis :: Lens' RoomP2PStatus (Maybe Int32) Source #
The amount of time in milliseconds it took to send packets back and forth on the unreliable channel with this peer.
TurnBasedMatchModification
data TurnBasedMatchModification Source #
This is a JSON template for turn-based match modification metadata.
See: turnBasedMatchModification
smart constructor.
Instances
turnBasedMatchModification :: TurnBasedMatchModification Source #
Creates a value of TurnBasedMatchModification
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmmParticipantId :: Lens' TurnBasedMatchModification (Maybe Text) Source #
The ID of the participant that modified the match.
tbmmKind :: Lens' TurnBasedMatchModification Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchModification.
tbmmModifiedTimestampMillis :: Lens' TurnBasedMatchModification (Maybe Int64) Source #
The timestamp at which they modified the match, in milliseconds since the epoch in UTC.
EventDefinition
data EventDefinition Source #
This is a JSON template for an event definition resource.
See: eventDefinition
smart constructor.
Instances
eventDefinition :: EventDefinition Source #
Creates a value of EventDefinition
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
edIsDefaultImageURL :: Lens' EventDefinition (Maybe Bool) Source #
Indicates whether the icon image being returned is a default image, or is game-provided.
edKind :: Lens' EventDefinition Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventDefinition.
edVisibility :: Lens' EventDefinition (Maybe Text) Source #
The visibility of event being tracked in this definition. Possible values are: - "REVEALED": This event should be visible to all users. - "HIDDEN": This event should only be shown to users that have recorded this event at least once.
edImageURL :: Lens' EventDefinition (Maybe Text) Source #
The base URL for the image that represents the event.
edDisplayName :: Lens' EventDefinition (Maybe Text) Source #
The name to display for the event.
edChildEvents :: Lens' EventDefinition [EventChild] Source #
A list of events that are a child of this event.
edDescription :: Lens' EventDefinition (Maybe Text) Source #
Description of what this event represents.
RoomModification
data RoomModification Source #
This is a JSON template for room modification metadata.
See: roomModification
smart constructor.
Instances
roomModification :: RoomModification Source #
Creates a value of RoomModification
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rmParticipantId :: Lens' RoomModification (Maybe Text) Source #
The ID of the participant that modified the room.
rmKind :: Lens' RoomModification Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomModification.
rmModifiedTimestampMillis :: Lens' RoomModification (Maybe Int64) Source #
The timestamp at which they modified the room, in milliseconds since the epoch in UTC.
ScoresListWindowTimeSpan
data ScoresListWindowTimeSpan Source #
The time span for the scores and ranks you're requesting.
AllTime |
|
Daily |
|
Weekly |
|
Instances
EventUpdateRequest
data EventUpdateRequest Source #
This is a JSON template for an event period update resource.
See: eventUpdateRequest
smart constructor.
Instances
eventUpdateRequest :: EventUpdateRequest Source #
Creates a value of EventUpdateRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
eUpdateCount :: Lens' EventUpdateRequest (Maybe Int64) Source #
The number of times this event occurred in this time period.
eKind :: Lens' EventUpdateRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventUpdateRequest.
eDefinitionId :: Lens' EventUpdateRequest (Maybe Text) Source #
The ID of the event being modified in this update.
AchievementUnlockResponse
data AchievementUnlockResponse Source #
This is a JSON template for an achievement unlock response
See: achievementUnlockResponse
smart constructor.
Instances
achievementUnlockResponse :: AchievementUnlockResponse Source #
Creates a value of AchievementUnlockResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
achKind :: Lens' AchievementUnlockResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementUnlockResponse.
achNewlyUnlocked :: Lens' AchievementUnlockResponse (Maybe Bool) Source #
Whether this achievement was newly unlocked (that is, whether the unlock request for the achievement was the first for the player).
ScoresGetTimeSpan
data ScoresGetTimeSpan Source #
The time span for the scores and ranks you're requesting.
SGTSAll |
|
SGTSAllTime |
|
SGTSDaily |
|
SGTSWeekly |
|
Instances
PlayerAchievement
data PlayerAchievement Source #
This is a JSON template for an achievement object.
See: playerAchievement
smart constructor.
Instances
playerAchievement :: PlayerAchievement Source #
Creates a value of PlayerAchievement
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
paKind :: Lens' PlayerAchievement Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerAchievement.
paAchievementState :: Lens' PlayerAchievement (Maybe Text) Source #
The state of the achievement. Possible values are: - "HIDDEN" - Achievement is hidden. - "REVEALED" - Achievement is revealed. - "UNLOCKED" - Achievement is unlocked.
paFormattedCurrentStepsString :: Lens' PlayerAchievement (Maybe Text) Source #
The current steps for an incremental achievement as a string.
paExperiencePoints :: Lens' PlayerAchievement (Maybe Int64) Source #
Experience points earned for the achievement. This field is absent for achievements that have not yet been unlocked and 0 for achievements that have been unlocked by testers but that are unpublished.
paCurrentSteps :: Lens' PlayerAchievement (Maybe Int32) Source #
The current steps for an incremental achievement.
paLastUpdatedTimestamp :: Lens' PlayerAchievement (Maybe Int64) Source #
The timestamp of the last modification to this achievement's state.
RoomP2PStatuses
data RoomP2PStatuses Source #
This is a JSON template for an update on the status of peers in a room.
See: roomP2PStatuses
smart constructor.
Instances
roomP2PStatuses :: RoomP2PStatuses Source #
Creates a value of RoomP2PStatuses
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rppssKind :: Lens' RoomP2PStatuses Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomP2PStatuses.
rppssUpdates :: Lens' RoomP2PStatuses [RoomP2PStatus] Source #
The updates for the peers.
ImageAsset
data ImageAsset Source #
This is a JSON template for an image asset object.
See: imageAsset
smart constructor.
Instances
iaKind :: Lens' ImageAsset Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#imageAsset.
AchievementUpdateMultipleRequest
data AchievementUpdateMultipleRequest Source #
This is a JSON template for a list of achievement update requests.
See: achievementUpdateMultipleRequest
smart constructor.
Instances
achievementUpdateMultipleRequest :: AchievementUpdateMultipleRequest Source #
Creates a value of AchievementUpdateMultipleRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
aumruKind :: Lens' AchievementUpdateMultipleRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementUpdateMultipleRequest.
aumruUpdates :: Lens' AchievementUpdateMultipleRequest [AchievementUpdateRequest] Source #
The individual achievement update requests.
RoomAutoMatchStatus
data RoomAutoMatchStatus Source #
This is a JSON template for status of room automatching that is in progress.
See: roomAutoMatchStatus
smart constructor.
Instances
roomAutoMatchStatus :: RoomAutoMatchStatus Source #
Creates a value of RoomAutoMatchStatus
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ramsKind :: Lens' RoomAutoMatchStatus Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomAutoMatchStatus.
ramsWaitEstimateSeconds :: Lens' RoomAutoMatchStatus (Maybe Int32) Source #
An estimate for the amount of time (in seconds) that auto-matching is expected to take to complete.
AchievementUpdateRequest
data AchievementUpdateRequest Source #
This is a JSON template for a request to update an achievement.
See: achievementUpdateRequest
smart constructor.
Instances
achievementUpdateRequest :: AchievementUpdateRequest Source #
Creates a value of AchievementUpdateRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
auruAchievementId :: Lens' AchievementUpdateRequest (Maybe Text) Source #
The achievement this update is being applied to.
auruKind :: Lens' AchievementUpdateRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementUpdateRequest.
auruUpdateType :: Lens' AchievementUpdateRequest (Maybe Text) Source #
The type of update being applied. Possible values are: - "REVEAL" - Achievement is revealed. - "UNLOCK" - Achievement is unlocked. - "INCREMENT" - Achievement is incremented. - "SET_STEPS_AT_LEAST" - Achievement progress is set to at least the passed value.
auruSetStepsAtLeastPayload :: Lens' AchievementUpdateRequest (Maybe GamesAchievementSetStepsAtLeast) Source #
The payload if an update of type SET_STEPS_AT_LEAST was requested for the achievement.
auruIncrementPayload :: Lens' AchievementUpdateRequest (Maybe GamesAchievementIncrement) Source #
The payload if an update of type INCREMENT was requested for the achievement.
ScoresGetIncludeRankType
data ScoresGetIncludeRankType Source #
The types of ranks to return. If the parameter is omitted, no ranks will be returned.
SGIRTAll |
|
SGIRTPublic |
|
SGIRTSocial |
|
Instances
LeaderboardScoreRank
data LeaderboardScoreRank Source #
This is a JSON template for a score rank in a leaderboard.
See: leaderboardScoreRank
smart constructor.
Instances
leaderboardScoreRank :: LeaderboardScoreRank Source #
Creates a value of LeaderboardScoreRank
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
lsrNumScores :: Lens' LeaderboardScoreRank (Maybe Int64) Source #
The number of scores in the leaderboard.
lsrKind :: Lens' LeaderboardScoreRank Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#leaderboardScoreRank.
lsrFormattedRank :: Lens' LeaderboardScoreRank (Maybe Text) Source #
The rank in the leaderboard as a string.
lsrFormattedNumScores :: Lens' LeaderboardScoreRank (Maybe Text) Source #
The number of scores in the leaderboard as a string.
RoomCreateRequest
data RoomCreateRequest Source #
This is a JSON template for a room creation request.
See: roomCreateRequest
smart constructor.
Instances
roomCreateRequest :: RoomCreateRequest Source #
Creates a value of RoomCreateRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rooRequestId :: Lens' RoomCreateRequest (Maybe Int64) Source #
A randomly generated numeric ID. This number is used at the server to ensure that the request is handled correctly across retries.
rooVariant :: Lens' RoomCreateRequest (Maybe Int32) Source #
The variant / mode of the application to be played. This can be any integer value, or left blank. You should use a small number of variants to keep the auto-matching pool as large as possible.
rooNetworkDiagnostics :: Lens' RoomCreateRequest (Maybe NetworkDiagnostics) Source #
Network diagnostics for the client creating the room.
rooKind :: Lens' RoomCreateRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomCreateRequest.
rooInvitedPlayerIds :: Lens' RoomCreateRequest [Text] Source #
The player IDs to invite to the room.
rooClientAddress :: Lens' RoomCreateRequest (Maybe RoomClientAddress) Source #
Client address for the player creating the room.
rooAutoMatchingCriteria :: Lens' RoomCreateRequest (Maybe RoomAutoMatchingCriteria) Source #
Criteria for auto-matching players into this room.
rooCapabilities :: Lens' RoomCreateRequest [Text] Source #
The capabilities that this client supports for realtime communication.
PlayerListResponse
data PlayerListResponse Source #
This is a JSON template for a third party player list response.
See: playerListResponse
smart constructor.
Instances
playerListResponse :: PlayerListResponse Source #
Creates a value of PlayerListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
plrNextPageToken :: Lens' PlayerListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
plrKind :: Lens' PlayerListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerListResponse.
LeaderboardScores
data LeaderboardScores Source #
This is a JSON template for a ListScores response.
See: leaderboardScores
smart constructor.
Instances
leaderboardScores :: LeaderboardScores Source #
Creates a value of LeaderboardScores
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
lsNextPageToken :: Lens' LeaderboardScores (Maybe Text) Source #
The pagination token for the next page of results.
lsNumScores :: Lens' LeaderboardScores (Maybe Int64) Source #
The total number of scores in the leaderboard.
lsKind :: Lens' LeaderboardScores Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#leaderboardScores.
lsPlayerScore :: Lens' LeaderboardScores (Maybe LeaderboardEntry) Source #
The score of the requesting player on the leaderboard. The player's score may appear both here and in the list of scores above. If you are viewing a public leaderboard and the player is not sharing their gameplay information publicly, the scoreRank and formattedScoreRank values will not be present.
lsItems :: Lens' LeaderboardScores [LeaderboardEntry] Source #
The scores in the leaderboard.
lsPrevPageToken :: Lens' LeaderboardScores (Maybe Text) Source #
The pagination token for the previous page of results.
AchievementDefinition
data AchievementDefinition Source #
This is a JSON template for an achievement definition object.
See: achievementDefinition
smart constructor.
Instances
achievementDefinition :: AchievementDefinition Source #
Creates a value of AchievementDefinition
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
adAchievementType :: Lens' AchievementDefinition (Maybe Text) Source #
The type of the achievement. Possible values are: - "STANDARD" - Achievement is either locked or unlocked. - "INCREMENTAL" - Achievement is incremental.
adFormattedTotalSteps :: Lens' AchievementDefinition (Maybe Text) Source #
The total steps for an incremental achievement as a string.
adRevealedIconURL :: Lens' AchievementDefinition (Maybe Text) Source #
The image URL for the revealed achievement icon.
adKind :: Lens' AchievementDefinition Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementDefinition.
adExperiencePoints :: Lens' AchievementDefinition (Maybe Int64) Source #
Experience points which will be earned when unlocking this achievement.
adInitialState :: Lens' AchievementDefinition (Maybe Text) Source #
The initial state of the achievement. Possible values are: - "HIDDEN" - Achievement is hidden. - "REVEALED" - Achievement is revealed. - "UNLOCKED" - Achievement is unlocked.
adIsUnlockedIconURLDefault :: Lens' AchievementDefinition (Maybe Bool) Source #
Indicates whether the unlocked icon image being returned is a default image, or is game-provided.
adTotalSteps :: Lens' AchievementDefinition (Maybe Int32) Source #
The total steps for an incremental achievement.
adDescription :: Lens' AchievementDefinition (Maybe Text) Source #
The description of the achievement.
adIsRevealedIconURLDefault :: Lens' AchievementDefinition (Maybe Bool) Source #
Indicates whether the revealed icon image being returned is a default image, or is provided by the game.
adUnlockedIconURL :: Lens' AchievementDefinition (Maybe Text) Source #
The image URL for the unlocked achievement icon.
TurnBasedMatchCreateRequest
data TurnBasedMatchCreateRequest Source #
This is a JSON template for a turn-based match creation request.
See: turnBasedMatchCreateRequest
smart constructor.
Instances
turnBasedMatchCreateRequest :: TurnBasedMatchCreateRequest Source #
Creates a value of TurnBasedMatchCreateRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmcrRequestId :: Lens' TurnBasedMatchCreateRequest (Maybe Int64) Source #
A randomly generated numeric ID. This number is used at the server to ensure that the request is handled correctly across retries.
tbmcrVariant :: Lens' TurnBasedMatchCreateRequest (Maybe Int32) Source #
The variant / mode of the application to be played. This can be any integer value, or left blank. You should use a small number of variants to keep the auto-matching pool as large as possible.
tbmcrKind :: Lens' TurnBasedMatchCreateRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchCreateRequest.
tbmcrInvitedPlayerIds :: Lens' TurnBasedMatchCreateRequest [Text] Source #
The player ids to invite to the match.
tbmcrAutoMatchingCriteria :: Lens' TurnBasedMatchCreateRequest (Maybe TurnBasedAutoMatchingCriteria) Source #
Criteria for auto-matching players into this match.
EventBatchRecordFailure
data EventBatchRecordFailure Source #
This is a JSON template for a batch update failure resource.
See: eventBatchRecordFailure
smart constructor.
Instances
eventBatchRecordFailure :: EventBatchRecordFailure Source #
Creates a value of EventBatchRecordFailure
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ebrfKind :: Lens' EventBatchRecordFailure Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventBatchRecordFailure.
ebrfRange :: Lens' EventBatchRecordFailure (Maybe EventPeriodRange) Source #
The time range which was rejected; empty for a request-wide failure.
ebrfFailureCause :: Lens' EventBatchRecordFailure (Maybe Text) Source #
The cause for the update failure. Possible values are: - "TOO_LARGE": A batch request was issued with more events than are allowed in a single batch. - "TIME_PERIOD_EXPIRED": A batch was sent with data too far in the past to record. - "TIME_PERIOD_SHORT": A batch was sent with a time range that was too short. - "TIME_PERIOD_LONG": A batch was sent with a time range that was too long. - "ALREADY_UPDATED": An attempt was made to record a batch of data which was already seen. - "RECORD_RATE_HIGH": An attempt was made to record data faster than the server will apply updates.
TurnBasedMatchResults
data TurnBasedMatchResults Source #
This is a JSON template for a turn-based match results object.
See: turnBasedMatchResults
smart constructor.
Instances
turnBasedMatchResults :: TurnBasedMatchResults Source #
Creates a value of TurnBasedMatchResults
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmrResults :: Lens' TurnBasedMatchResults [ParticipantResult] Source #
The match results for the participants in the match.
tbmrKind :: Lens' TurnBasedMatchResults Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchResults.
tbmrData :: Lens' TurnBasedMatchResults (Maybe TurnBasedMatchDataRequest) Source #
The final match data.
tbmrMatchVersion :: Lens' TurnBasedMatchResults (Maybe Int32) Source #
The version of the match being updated.
PushTokenIdIos
data PushTokenIdIos Source #
A push token ID for iOS devices.
See: pushTokenIdIos
smart constructor.
Instances
pushTokenIdIos :: PushTokenIdIos Source #
Creates a value of PushTokenIdIos
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ptiiAPNSDeviceToken :: Lens' PushTokenIdIos (Maybe ByteString) Source #
Device token supplied by an iOS system call to register for remote notifications. Encode this field as web-safe base64.
ptiiAPNSEnvironment :: Lens' PushTokenIdIos (Maybe Text) Source #
Indicates whether this token should be used for the production or sandbox APNS server.
RoomLeaveRequest
data RoomLeaveRequest Source #
This is a JSON template for a leave room request.
See: roomLeaveRequest
smart constructor.
Instances
roomLeaveRequest :: RoomLeaveRequest Source #
Creates a value of RoomLeaveRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rlrKind :: Lens' RoomLeaveRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomLeaveRequest.
rlrReason :: Lens' RoomLeaveRequest (Maybe Text) Source #
Reason for leaving the match. Possible values are: - "PLAYER_LEFT" - The player chose to leave the room.. - "GAME_LEFT" - The game chose to remove the player from the room. - "REALTIME_ABANDONED" - The player switched to another application and abandoned the room. - "REALTIME_PEER_CONNECTION_FAILURE" - The client was unable to establish a connection to other peer(s). - "REALTIME_SERVER_CONNECTION_FAILURE" - The client was unable to communicate with the server. - "REALTIME_SERVER_ERROR" - The client received an error response when it tried to communicate with the server. - "REALTIME_TIMEOUT" - The client timed out while waiting for a room. - "REALTIME_CLIENT_DISCONNECTING" - The client disconnects without first calling Leave. - "REALTIME_SIGN_OUT" - The user signed out of G+ while in the room. - "REALTIME_GAME_CRASHED" - The game crashed. - "REALTIME_ROOM_SERVICE_CRASHED" - RoomAndroidService crashed. - "REALTIME_DIFFERENT_CLIENT_ROOM_OPERATION" - Another client is trying to enter a room. - "REALTIME_SAME_CLIENT_ROOM_OPERATION" - The same client is trying to enter a new room.
rlrLeaveDiagnostics :: Lens' RoomLeaveRequest (Maybe RoomLeaveDiagnostics) Source #
Diagnostics for a player leaving the room.
Played
This is a JSON template for metadata about a player playing a game with the currently authenticated user.
See: played
smart constructor.
Instances
Eq Played Source # | |
Data Played Source # | |
Defined in Network.Google.Games.Types.Product gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Played -> c Played # gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Played # toConstr :: Played -> Constr # dataTypeOf :: Played -> DataType # dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Played) # dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Played) # gmapT :: (forall b. Data b => b -> b) -> Played -> Played # gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Played -> r # gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Played -> r # gmapQ :: (forall d. Data d => d -> u) -> Played -> [u] # gmapQi :: Int -> (forall d. Data d => d -> u) -> Played -> u # gmapM :: Monad m => (forall d. Data d => d -> m d) -> Played -> m Played # gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Played -> m Played # gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Played -> m Played # | |
Show Played Source # | |
Generic Played Source # | |
ToJSON Played Source # | |
Defined in Network.Google.Games.Types.Product | |
FromJSON Played Source # | |
type Rep Played Source # | |
Defined in Network.Google.Games.Types.Product type Rep Played = D1 (MetaData "Played" "Network.Google.Games.Types.Product" "gogol-games-0.4.0-EPjClsFfNAGupIHqlLfHm" False) (C1 (MetaCons "Played'" PrefixI True) (S1 (MetaSel (Just "_pKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text) :*: (S1 (MetaSel (Just "_pAutoMatched") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_pTimeMillis") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) |
Creates a value of Played
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pKind :: Lens' Played Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#played.
pAutoMatched :: Lens' Played (Maybe Bool) Source #
True if the player was auto-matched with the currently authenticated user.
pTimeMillis :: Lens' Played (Maybe Int64) Source #
The last time the player played the game in milliseconds since the epoch in UTC.
AchievementIncrementResponse
data AchievementIncrementResponse Source #
This is a JSON template for an achievement increment response
See: achievementIncrementResponse
smart constructor.
Instances
achievementIncrementResponse :: AchievementIncrementResponse Source #
Creates a value of AchievementIncrementResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
airKind :: Lens' AchievementIncrementResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementIncrementResponse.
airNewlyUnlocked :: Lens' AchievementIncrementResponse (Maybe Bool) Source #
Whether the current steps for the achievement has reached the number of steps required to unlock.
airCurrentSteps :: Lens' AchievementIncrementResponse (Maybe Int32) Source #
The current steps recorded for this incremental achievement.
AchievementRevealResponse
data AchievementRevealResponse Source #
This is a JSON template for an achievement reveal response
See: achievementRevealResponse
smart constructor.
Instances
achievementRevealResponse :: AchievementRevealResponse Source #
Creates a value of AchievementRevealResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
arrKind :: Lens' AchievementRevealResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementRevealResponse.
arrCurrentState :: Lens' AchievementRevealResponse (Maybe Text) Source #
The current state of the achievement for which a reveal was attempted. This might be UNLOCKED if the achievement was already unlocked. Possible values are: - "REVEALED" - Achievement is revealed. - "UNLOCKED" - Achievement is unlocked.
AchievementSetStepsAtLeastResponse
data AchievementSetStepsAtLeastResponse Source #
This is a JSON template for an achievement set steps at least response.
See: achievementSetStepsAtLeastResponse
smart constructor.
Instances
achievementSetStepsAtLeastResponse :: AchievementSetStepsAtLeastResponse Source #
Creates a value of AchievementSetStepsAtLeastResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
assalrKind :: Lens' AchievementSetStepsAtLeastResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#achievementSetStepsAtLeastResponse.
assalrNewlyUnlocked :: Lens' AchievementSetStepsAtLeastResponse (Maybe Bool) Source #
Whether the the current steps for the achievement has reached the number of steps required to unlock.
assalrCurrentSteps :: Lens' AchievementSetStepsAtLeastResponse (Maybe Int32) Source #
The current steps recorded for this incremental achievement.
PlayerAchievementListResponse
data PlayerAchievementListResponse Source #
This is a JSON template for a list of achievement objects.
See: playerAchievementListResponse
smart constructor.
Instances
playerAchievementListResponse :: PlayerAchievementListResponse Source #
Creates a value of PlayerAchievementListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
palrNextPageToken :: Lens' PlayerAchievementListResponse (Maybe Text) Source #
Token corresponding to the next page of results.
palrKind :: Lens' PlayerAchievementListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerAchievementListResponse.
palrItems :: Lens' PlayerAchievementListResponse [PlayerAchievement] Source #
The achievements.
EventRecordRequest
data EventRecordRequest Source #
This is a JSON template for an event period update resource.
See: eventRecordRequest
smart constructor.
Instances
eventRecordRequest :: EventRecordRequest Source #
Creates a value of EventRecordRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
errRequestId :: Lens' EventRecordRequest (Maybe Int64) Source #
The request ID used to identify this attempt to record events.
errKind :: Lens' EventRecordRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventRecordRequest.
errCurrentTimeMillis :: Lens' EventRecordRequest (Maybe Int64) Source #
The current time when this update was sent, in milliseconds, since 1970 UTC (Unix Epoch).
errTimePeriods :: Lens' EventRecordRequest [EventPeriodUpdate] Source #
A list of the time period updates being made in this request.
RoomAutoMatchingCriteria
data RoomAutoMatchingCriteria Source #
This is a JSON template for a room auto-match criteria object.
See: roomAutoMatchingCriteria
smart constructor.
Instances
roomAutoMatchingCriteria :: RoomAutoMatchingCriteria Source #
Creates a value of RoomAutoMatchingCriteria
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ramcKind :: Lens' RoomAutoMatchingCriteria Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomAutoMatchingCriteria.
ramcExclusiveBitmask :: Lens' RoomAutoMatchingCriteria (Maybe Int64) Source #
A bitmask indicating when auto-matches are valid. When ANDed with other exclusive bitmasks, the result must be zero. Can be used to support exclusive roles within a game.
ramcMaxAutoMatchingPlayers :: Lens' RoomAutoMatchingCriteria (Maybe Int32) Source #
The maximum number of players that should be added to the room by auto-matching.
ramcMinAutoMatchingPlayers :: Lens' RoomAutoMatchingCriteria (Maybe Int32) Source #
The minimum number of players that should be added to the room by auto-matching.
ScoresListTimeSpan
data ScoresListTimeSpan Source #
The time span for the scores and ranks you're requesting.
SLTSAllTime |
|
SLTSDaily |
|
SLTSWeekly |
|
Instances
QuestMilestone
data QuestMilestone Source #
This is a JSON template for a Quest Milestone resource.
See: questMilestone
smart constructor.
Instances
questMilestone :: QuestMilestone Source #
Creates a value of QuestMilestone
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
qmState :: Lens' QuestMilestone (Maybe Text) Source #
The current state of the milestone. Possible values are: - "COMPLETED_NOT_CLAIMED" - The milestone is complete, but has not yet been claimed. - "CLAIMED" - The milestone is complete and has been claimed. - "NOT_COMPLETED" - The milestone has not yet been completed. - "NOT_STARTED" - The milestone is for a quest that has not yet been accepted.
qmKind :: Lens' QuestMilestone Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#questMilestone.
qmCompletionRewardData :: Lens' QuestMilestone (Maybe ByteString) Source #
The completion reward data of the milestone, represented as a Base64-encoded string. This is a developer-specified binary blob with size between 0 and 2 KB before encoding.
qmCriteria :: Lens' QuestMilestone [QuestCriterion] Source #
The criteria of the milestone.
PeerSessionDiagnostics
data PeerSessionDiagnostics Source #
This is a JSON template for peer session diagnostics.
See: peerSessionDiagnostics
smart constructor.
Instances
peerSessionDiagnostics :: PeerSessionDiagnostics Source #
Creates a value of PeerSessionDiagnostics
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
psdConnectedTimestampMillis :: Lens' PeerSessionDiagnostics (Maybe Int64) Source #
Connected time in milliseconds.
psdParticipantId :: Lens' PeerSessionDiagnostics (Maybe Text) Source #
The participant ID of the peer.
psdKind :: Lens' PeerSessionDiagnostics Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#peerSessionDiagnostics.
psdUnreliableChannel :: Lens' PeerSessionDiagnostics (Maybe PeerChannelDiagnostics) Source #
Unreliable channel diagnostics.
psdReliableChannel :: Lens' PeerSessionDiagnostics (Maybe PeerChannelDiagnostics) Source #
Reliable channel diagnostics.
PushTokenId
data PushTokenId Source #
This is a JSON template for a push token ID resource.
See: pushTokenId
smart constructor.
Instances
pushTokenId :: PushTokenId Source #
Creates a value of PushTokenId
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ptiIos :: Lens' PushTokenId (Maybe PushTokenIdIos) Source #
A push token ID for iOS devices.
ptiKind :: Lens' PushTokenId Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#pushTokenId.
EventPeriodUpdate
data EventPeriodUpdate Source #
This is a JSON template for an event period update resource.
See: eventPeriodUpdate
smart constructor.
Instances
eventPeriodUpdate :: EventPeriodUpdate Source #
Creates a value of EventPeriodUpdate
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
epuKind :: Lens' EventPeriodUpdate Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventPeriodUpdate.
epuTimePeriod :: Lens' EventPeriodUpdate (Maybe EventPeriodRange) Source #
The time period being covered by this update.
epuUpdates :: Lens' EventPeriodUpdate [EventUpdateRequest] Source #
The updates being made for this time period.
TurnBasedMatchSync
data TurnBasedMatchSync Source #
This is a JSON template for a list of turn-based matches returned from a sync.
See: turnBasedMatchSync
smart constructor.
Instances
turnBasedMatchSync :: TurnBasedMatchSync Source #
Creates a value of TurnBasedMatchSync
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmsMoreAvailable :: Lens' TurnBasedMatchSync (Maybe Bool) Source #
True if there were more matches available to fetch at the time the response was generated (which were not returned due to page size limits.)
tbmsNextPageToken :: Lens' TurnBasedMatchSync (Maybe Text) Source #
The pagination token for the next page of results.
tbmsKind :: Lens' TurnBasedMatchSync Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchSync.
tbmsItems :: Lens' TurnBasedMatchSync [TurnBasedMatch] Source #
The matches.
ScoreSubmission
data ScoreSubmission Source #
This is a JSON template for a request to submit a score to leaderboards.
See: scoreSubmission
smart constructor.
Instances
scoreSubmission :: ScoreSubmission Source #
Creates a value of ScoreSubmission
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
scoSignature :: Lens' ScoreSubmission (Maybe Text) Source #
Signature Values will contain URI-safe characters as defined by section 2.3 of RFC 3986.
scoScoreTag :: Lens' ScoreSubmission (Maybe Text) Source #
Additional information about this score. Values will contain no more than 64 URI-safe characters as defined by section 2.3 of RFC 3986.
scoKind :: Lens' ScoreSubmission Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#scoreSubmission.
scoLeaderboardId :: Lens' ScoreSubmission (Maybe Text) Source #
The leaderboard this score is being submitted to.
RoomLeaveDiagnostics
data RoomLeaveDiagnostics Source #
This is a JSON template for room leave diagnostics.
See: roomLeaveDiagnostics
smart constructor.
Instances
roomLeaveDiagnostics :: RoomLeaveDiagnostics Source #
Creates a value of RoomLeaveDiagnostics
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
rldPeerSession :: Lens' RoomLeaveDiagnostics [PeerSessionDiagnostics] Source #
Diagnostics about all peer sessions.
rldAndroidNetworkType :: Lens' RoomLeaveDiagnostics (Maybe Int32) Source #
Android network type. http://developer.android.com/reference/android/net/NetworkInfo.html#getType()
rldKind :: Lens' RoomLeaveDiagnostics Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#roomLeaveDiagnostics.
rldNetworkOperatorCode :: Lens' RoomLeaveDiagnostics (Maybe Text) Source #
The MCC+MNC code for the client's network connection. On Android: http://developer.android.com/reference/android/telephony/TelephonyManager.html#getNetworkOperator() On iOS, see: https://developer.apple.com/library/ios/documentation/NetworkingInternet/Reference/CTCarrier/Reference/Reference.html
rldNetworkOperatorName :: Lens' RoomLeaveDiagnostics (Maybe Text) Source #
The name of the carrier of the client's network connection. On Android: http://developer.android.com/reference/android/telephony/TelephonyManager.html#getNetworkOperatorName() On iOS: https://developer.apple.com/library/ios/documentation/NetworkingInternet/Reference/CTCarrier/Reference/Reference.html#//apple_ref/occ/instp/CTCarrier/carrierName
rldSocketsUsed :: Lens' RoomLeaveDiagnostics (Maybe Bool) Source #
Whether or not sockets were used.
rldIosNetworkType :: Lens' RoomLeaveDiagnostics (Maybe Int32) Source #
iOS network type as defined in Reachability.h.
rldAndroidNetworkSubtype :: Lens' RoomLeaveDiagnostics (Maybe Int32) Source #
Android network subtype. http://developer.android.com/reference/android/net/NetworkInfo.html#getSubtype()
AggregateStats
data AggregateStats Source #
This is a JSON template for aggregate stats.
See: aggregateStats
smart constructor.
Instances
asKind :: Lens' AggregateStats Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#aggregateStats.
asCount :: Lens' AggregateStats (Maybe Int64) Source #
The number of messages sent between a pair of peers.
asSum :: Lens' AggregateStats (Maybe Int64) Source #
The total number of bytes sent for messages between a pair of peers.
InstanceWebDetails
data InstanceWebDetails Source #
This is a JSON template for the Web details resource.
See: instanceWebDetails
smart constructor.
Instances
instanceWebDetails :: InstanceWebDetails Source #
Creates a value of InstanceWebDetails
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
iwdPreferred :: Lens' InstanceWebDetails (Maybe Bool) Source #
Indicates that this instance is the default for new installations.
iwdKind :: Lens' InstanceWebDetails Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#instanceWebDetails.
iwdLaunchURL :: Lens' InstanceWebDetails (Maybe Text) Source #
Launch URL for the game.
TurnBasedMatchRematch
data TurnBasedMatchRematch Source #
This is a JSON template for a rematch response.
See: turnBasedMatchRematch
smart constructor.
Instances
turnBasedMatchRematch :: TurnBasedMatchRematch Source #
Creates a value of TurnBasedMatchRematch
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tRematch :: Lens' TurnBasedMatchRematch (Maybe TurnBasedMatch) Source #
The newly created match; a rematch of the old match with the same participants.
tKind :: Lens' TurnBasedMatchRematch Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchRematch.
tPreviousMatch :: Lens' TurnBasedMatchRematch (Maybe TurnBasedMatch) Source #
The old match that the rematch was created from; will be updated such that the rematchId field will point at the new match.
PlayerExperienceInfo
data PlayerExperienceInfo Source #
This is a JSON template for 1P/3P metadata about the player's experience.
See: playerExperienceInfo
smart constructor.
Instances
playerExperienceInfo :: PlayerExperienceInfo Source #
Creates a value of PlayerExperienceInfo
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
peiKind :: Lens' PlayerExperienceInfo Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerExperienceInfo.
peiCurrentExperiencePoints :: Lens' PlayerExperienceInfo (Maybe Int64) Source #
The current number of experience points for the player.
peiCurrentLevel :: Lens' PlayerExperienceInfo (Maybe PlayerLevel) Source #
The current level of the player.
peiNextLevel :: Lens' PlayerExperienceInfo (Maybe PlayerLevel) Source #
The next level of the player. If the current level is the maximum level, this should be same as the current level.
peiLastLevelUpTimestampMillis :: Lens' PlayerExperienceInfo (Maybe Int64) Source #
The timestamp when the player was leveled up, in millis since Unix epoch UTC.
GamesAchievementSetStepsAtLeast
data GamesAchievementSetStepsAtLeast Source #
This is a JSON template for the payload to request to increment an achievement.
See: gamesAchievementSetStepsAtLeast
smart constructor.
Instances
gamesAchievementSetStepsAtLeast :: GamesAchievementSetStepsAtLeast Source #
Creates a value of GamesAchievementSetStepsAtLeast
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
gassalKind :: Lens' GamesAchievementSetStepsAtLeast Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#GamesAchievementSetStepsAtLeast.
gassalSteps :: Lens' GamesAchievementSetStepsAtLeast (Maybe Int32) Source #
The minimum number of steps for the achievement to be set to.
Player
This is a JSON template for a Player resource.
See: player
smart constructor.
Instances
Creates a value of Player
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
plaBannerURLLandscape :: Lens' Player (Maybe Text) Source #
The url to the landscape mode player banner image.
plaLastPlayedWith :: Lens' Player (Maybe Played) Source #
Details about the last time this player played a multiplayer game with the currently authenticated player. Populated for PLAYED_WITH player collection members.
plaAvatarImageURL :: Lens' Player (Maybe Text) Source #
The base URL for the image that represents the player.
plaKind :: Lens' Player Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#player.
plaExperienceInfo :: Lens' Player (Maybe PlayerExperienceInfo) Source #
An object to represent Play Game experience information for the player.
plaName :: Lens' Player (Maybe PlayerName) Source #
An object representation of the individual components of the player's name. For some players, these fields may not be present.
plaOriginalPlayerId :: Lens' Player (Maybe Text) Source #
The player ID that was used for this player the first time they signed into the game in question. This is only populated for calls to player.get for the requesting player, only if the player ID has subsequently changed, and only to clients that support remapping player IDs.
plaTitle :: Lens' Player (Maybe Text) Source #
The player's title rewarded for their game activities.
plaBannerURLPortrait :: Lens' Player (Maybe Text) Source #
The url to the portrait mode player banner image.
plaProFileSettings :: Lens' Player (Maybe ProFileSettings) Source #
The player's profile settings. Controls whether or not the player's profile is visible to other players.
GamesAchievementIncrement
data GamesAchievementIncrement Source #
This is a JSON template for the payload to request to increment an achievement.
See: gamesAchievementIncrement
smart constructor.
Instances
gamesAchievementIncrement :: GamesAchievementIncrement Source #
Creates a value of GamesAchievementIncrement
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
gaiRequestId :: Lens' GamesAchievementIncrement (Maybe Int64) Source #
The requestId associated with an increment to an achievement.
gaiKind :: Lens' GamesAchievementIncrement Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#GamesAchievementIncrement.
gaiSteps :: Lens' GamesAchievementIncrement (Maybe Int32) Source #
The number of steps to be incremented.
Quest
This is a JSON template for a Quest resource.
See: quest
smart constructor.
Instances
Creates a value of Quest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
queLastUpdatedTimestampMillis :: Lens' Quest (Maybe Int64) Source #
The timestamp at which the quest was last updated by the user in milliseconds since the epoch in UTC. Only present if the player has accepted the quest.
queState :: Lens' Quest (Maybe Text) Source #
The state of the quest. Possible values are: - "UPCOMING": The quest is upcoming. The user can see the quest, but cannot accept it until it is open. - "OPEN": The quest is currently open and may be accepted at this time. - "ACCEPTED": The user is currently participating in this quest. - "COMPLETED": The user has completed the quest. - "FAILED": The quest was attempted but was not completed before the deadline expired. - "EXPIRED": The quest has expired and was not accepted. - "DELETED": The quest should be deleted from the local database.
queMilestones :: Lens' Quest [QuestMilestone] Source #
The quest milestones.
queKind :: Lens' Quest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#quest.
queApplicationId :: Lens' Quest (Maybe Text) Source #
The ID of the application this quest is part of.
queEndTimestampMillis :: Lens' Quest (Maybe Int64) Source #
The timestamp at which the quest ceases to be active in milliseconds since the epoch in UTC.
queStartTimestampMillis :: Lens' Quest (Maybe Int64) Source #
The timestamp at which the quest becomes active in milliseconds since the epoch in UTC.
queNotifyTimestampMillis :: Lens' Quest (Maybe Int64) Source #
The timestamp at which the user should be notified that the quest will end soon in milliseconds since the epoch in UTC.
queIsDefaultBannerURL :: Lens' Quest (Maybe Bool) Source #
Indicates whether the banner image being returned is a default image, or is game-provided.
queIsDefaultIconURL :: Lens' Quest (Maybe Bool) Source #
Indicates whether the icon image being returned is a default image, or is game-provided.
queAcceptedTimestampMillis :: Lens' Quest (Maybe Int64) Source #
The timestamp at which the user accepted the quest in milliseconds since the epoch in UTC. Only present if the player has accepted the quest.
EventChild
data EventChild Source #
This is a JSON template for an event child relationship resource.
See: eventChild
smart constructor.
Instances
eventChild :: EventChild Source #
Creates a value of EventChild
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
ecKind :: Lens' EventChild Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventChild.
ApplicationVerifyResponse
data ApplicationVerifyResponse Source #
This is a JSON template for a third party application verification response resource.
See: applicationVerifyResponse
smart constructor.
Instances
applicationVerifyResponse :: ApplicationVerifyResponse Source #
Creates a value of ApplicationVerifyResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
avrKind :: Lens' ApplicationVerifyResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#applicationVerifyResponse.
avrAlternatePlayerId :: Lens' ApplicationVerifyResponse (Maybe Text) Source #
An alternate ID that was once used for the player that was issued the auth token used in this request. (This field is not normally populated.)
avrPlayerId :: Lens' ApplicationVerifyResponse (Maybe Text) Source #
The ID of the player that was issued the auth token used in this request.
PlayerEventListResponse
data PlayerEventListResponse Source #
This is a JSON template for a ListByPlayer response.
See: playerEventListResponse
smart constructor.
Instances
playerEventListResponse :: PlayerEventListResponse Source #
Creates a value of PlayerEventListResponse
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pelrNextPageToken :: Lens' PlayerEventListResponse (Maybe Text) Source #
The pagination token for the next page of results.
pelrKind :: Lens' PlayerEventListResponse Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerEventListResponse.
pelrItems :: Lens' PlayerEventListResponse [PlayerEvent] Source #
The player events.
TurnBasedMatchDataRequest
data TurnBasedMatchDataRequest Source #
This is a JSON template for sending a turn-based match data object.
See: turnBasedMatchDataRequest
smart constructor.
Instances
turnBasedMatchDataRequest :: TurnBasedMatchDataRequest Source #
Creates a value of TurnBasedMatchDataRequest
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
tbmdrKind :: Lens' TurnBasedMatchDataRequest Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#turnBasedMatchDataRequest.
tbmdrData :: Lens' TurnBasedMatchDataRequest (Maybe ByteString) Source #
The byte representation of the data (limited to 128 kB), as a Base64-encoded string with the URL_SAFE encoding option.
ProFileSettings
data ProFileSettings Source #
This is a JSON template for profile settings
See: proFileSettings
smart constructor.
Instances
proFileSettings :: ProFileSettings Source #
Creates a value of ProFileSettings
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
pfsProFileVisible :: Lens' ProFileSettings (Maybe Bool) Source #
The player's current profile visibility. This field is visible to both 1P and 3P APIs.
pfsKind :: Lens' ProFileSettings Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#profileSettings.
EventPeriodRange
data EventPeriodRange Source #
This is a JSON template for an event period time range.
See: eventPeriodRange
smart constructor.
Instances
eventPeriodRange :: EventPeriodRange Source #
Creates a value of EventPeriodRange
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
eprKind :: Lens' EventPeriodRange Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventPeriodRange.
eprPeriodStartMillis :: Lens' EventPeriodRange (Maybe Int64) Source #
The time when this update period begins, in millis, since 1970 UTC (Unix Epoch).
eprPeriodEndMillis :: Lens' EventPeriodRange (Maybe Int64) Source #
The time when this update period ends, in millis, since 1970 UTC (Unix Epoch).
MetagameListCategoriesByPlayerCollection
data MetagameListCategoriesByPlayerCollection Source #
The collection of categories for which data will be returned.
All |
|
Instances
AchievementsListState
data AchievementsListState Source #
Tells the server to return only achievements with the specified state. If this parameter isn't specified, all achievements are returned.
ALSAll |
|
ALSHidden |
|
ALSRevealed |
|
ALSUnlocked |
|
Instances
EventRecordFailure
data EventRecordFailure Source #
This is a JSON template for an event update failure resource.
See: eventRecordFailure
smart constructor.
Instances
eventRecordFailure :: EventRecordFailure Source #
Creates a value of EventRecordFailure
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
erfKind :: Lens' EventRecordFailure Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#eventRecordFailure.
erfFailureCause :: Lens' EventRecordFailure (Maybe Text) Source #
The cause for the update failure. Possible values are: - "NOT_FOUND" - An attempt was made to set an event that was not defined. - "INVALID_UPDATE_VALUE" - An attempt was made to increment an event by a non-positive value.
erfEventId :: Lens' EventRecordFailure (Maybe Text) Source #
The ID of the event that was not updated.
PlayerScoreSubmissionList
data PlayerScoreSubmissionList Source #
This is a JSON template for a list of score submission requests
See: playerScoreSubmissionList
smart constructor.
Instances
playerScoreSubmissionList :: PlayerScoreSubmissionList Source #
Creates a value of PlayerScoreSubmissionList
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
psslKind :: Lens' PlayerScoreSubmissionList Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#playerScoreSubmissionList.
psslScores :: Lens' PlayerScoreSubmissionList [ScoreSubmission] Source #
The score submissions.
Instance
This is a JSON template for the Instance resource.
See: instance'
smart constructor.
Instances
instance' :: Instance Source #
Creates a value of Instance
with the minimum fields required to make a request.
Use one of the following lenses to modify other fields as desired:
iAndroidInstance :: Lens' Instance (Maybe InstanceAndroidDetails) Source #
Platform dependent details for Android.
iKind :: Lens' Instance Text Source #
Uniquely identifies the type of this resource. Value is always the fixed string games#instance.
iWebInstance :: Lens' Instance (Maybe InstanceWebDetails) Source #
Platform dependent details for Web.
iIosInstance :: Lens' Instance (Maybe InstanceIosDetails) Source #
Platform dependent details for iOS.
iAcquisitionURI :: Lens' Instance (Maybe Text) Source #
URI which shows where a user can acquire this instance.
iPlatformType :: Lens' Instance (Maybe Text) Source #
The platform type. Possible values are: - "ANDROID" - Instance is for Android. - "IOS" - Instance is for iOS - "WEB_APP" - Instance is for Web App.