{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Games.Types
(
gamesService
, gamesScope
, driveAppDataScope
, PlayersListCollection (..)
, RoomJoinRequest
, roomJoinRequest
, rjrNetworkDiagnostics
, rjrKind
, rjrClientAddress
, rjrCapabilities
, PlayerName
, playerName
, pnGivenName
, pnFamilyName
, Snapshot
, snapshot
, sLastModifiedMillis
, sKind
, sProgressValue
, sUniqueName
, sCoverImage
, sId
, sDurationMillis
, sTitle
, sType
, sDescription
, sDriveId
, Room
, room
, rStatus
, rVariant
, rKind
, rAutoMatchingStatus
, rCreationDetails
, rInviterId
, rLastUpdateDetails
, rRoomStatusVersion
, rParticipants
, rApplicationId
, rAutoMatchingCriteria
, rRoomId
, rDescription
, QuestListResponse
, questListResponse
, qlrNextPageToken
, qlrKind
, qlrItems
, TurnBasedMatch
, turnBasedMatch
, tbmStatus
, tbmVariant
, tbmResults
, tbmMatchNumber
, tbmKind
, tbmData
, tbmWithParticipantId
, tbmCreationDetails
, tbmInviterId
, tbmLastUpdateDetails
, tbmParticipants
, tbmApplicationId
, tbmAutoMatchingCriteria
, tbmPreviousMatchData
, tbmPendingParticipantId
, tbmUserMatchStatus
, tbmMatchId
, tbmDescription
, tbmRematchId
, tbmMatchVersion
, TurnBasedMatchData
, turnBasedMatchData
, tbmdKind
, tbmdData
, tbmdDataAvailable
, ScoresListCollection (..)
, PlayerEvent
, playerEvent
, peKind
, peNumEvents
, peFormattedNumEvents
, peDefinitionId
, pePlayerId
, PlayerLeaderboardScore
, playerLeaderboardScore
, plsScoreTag
, plsScoreString
, plsKind
, plsScoreValue
, plsTimeSpan
, plsPublicRank
, plsSocialRank
, plsLeaderboardId
, plsWriteTimestamp
, Application
, application
, aThemeColor
, aLeaderboardCount
, aKind
, aCategory
, aName
, aEnabledFeatures
, aInstances
, aAuthor
, aId
, aAchievementCount
, aAssets
, aDescription
, aLastUpdatedTimestamp
, ApplicationCategory
, applicationCategory
, acSecondary
, acKind
, acPrimary
, PlayerScoreListResponse
, playerScoreListResponse
, pslrSubmittedScores
, pslrKind
, NetworkDiagnostics
, networkDiagnostics
, ndAndroidNetworkType
, ndKind
, ndNetworkOperatorCode
, ndNetworkOperatorName
, ndRegistrationLatencyMillis
, ndIosNetworkType
, ndAndroidNetworkSubtype
, TurnBasedMatchTurn
, turnBasedMatchTurn
, tbmtResults
, tbmtKind
, tbmtData
, tbmtPendingParticipantId
, tbmtMatchVersion
, QuestCriterion
, questCriterion
, qcCurrentContribution
, qcCompletionContribution
, qcKind
, qcInitialPlayerProgress
, qcEventId
, TurnBasedMatchList
, turnBasedMatchList
, tbmlNextPageToken
, tbmlKind
, tbmlItems
, PeerChannelDiagnostics
, peerChannelDiagnostics
, pcdNumMessagesLost
, pcdBytesSent
, pcdKind
, pcdRoundtripLatencyMillis
, pcdBytesReceived
, pcdNumMessagesReceived
, pcdNumSendFailures
, pcdNumMessagesSent
, RoomList
, roomList
, rlNextPageToken
, rlKind
, rlItems
, PushToken
, pushToken
, ptClientRevision
, ptKind
, ptLanguage
, ptId
, AchievementUpdateResponse
, achievementUpdateResponse
, aurUpdateOccurred
, aurAchievementId
, aurKind
, aurCurrentState
, aurNewlyUnlocked
, aurCurrentSteps
, LeaderboardEntry
, leaderboardEntry
, leScoreTag
, leWriteTimestampMillis
, leKind
, leScoreValue
, leFormattedScore
, leTimeSpan
, leFormattedScoreRank
, lePlayer
, leScoreRank
, SnapshotListResponse
, snapshotListResponse
, slrNextPageToken
, slrKind
, slrItems
, PlayerLevel
, playerLevel
, plMaxExperiencePoints
, plKind
, plMinExperiencePoints
, plLevel
, AchievementUpdateMultipleResponse
, achievementUpdateMultipleResponse
, aumrKind
, aumrUpdatedAchievements
, RoomParticipant
, roomParticipant
, rpStatus
, rpConnected
, rpLeaveReason
, rpKind
, rpClientAddress
, rpId
, rpAutoMatched
, rpPlayer
, rpCapabilities
, rpAutoMatchedPlayer
, ApplicationsGetPlatformType (..)
, EventDefinitionListResponse
, eventDefinitionListResponse
, edlrNextPageToken
, edlrKind
, edlrItems
, Category
, category
, cKind
, cCategory
, cExperiencePoints
, InstanceAndroidDetails
, instanceAndroidDetails
, iadPackageName
, iadPreferred
, iadKind
, iadEnablePiracyCheck
, TurnBasedMatchParticipant
, turnBasedMatchParticipant
, tbmpStatus
, tbmpKind
, tbmpId
, tbmpAutoMatched
, tbmpPlayer
, tbmpAutoMatchedPlayer
, AchievementDefinitionsListResponse
, achievementDefinitionsListResponse
, adlrNextPageToken
, adlrKind
, adlrItems
, PlayerScoreResponse
, playerScoreResponse
, psrScoreTag
, psrKind
, psrFormattedScore
, psrLeaderboardId
, psrBeatenScoreTimeSpans
, psrUnbeatenScores
, AnonymousPlayer
, anonymousPlayer
, apAvatarImageURL
, apKind
, apDisplayName
, QuestContribution
, questContribution
, qKind
, qValue
, qFormattedValue
, RoomClientAddress
, roomClientAddress
, rcaKind
, rcaXmppAddress
, LeaderboardListResponse
, leaderboardListResponse
, llrNextPageToken
, llrKind
, llrItems
, PlayerScore
, playerScore
, psScoreTag
, psScore
, psKind
, psFormattedScore
, psTimeSpan
, ScoresListWindowCollection (..)
, TurnBasedAutoMatchingCriteria
, turnBasedAutoMatchingCriteria
, tbamcKind
, tbamcExclusiveBitmask
, tbamcMaxAutoMatchingPlayers
, tbamcMinAutoMatchingPlayers
, SnapshotImage
, snapshotImage
, siHeight
, siKind
, siURL
, siMimeType
, siWidth
, RoomStatus
, roomStatus
, rsStatus
, rsKind
, rsAutoMatchingStatus
, rsStatusVersion
, rsParticipants
, rsRoomId
, PlayerLeaderboardScoreListResponse
, playerLeaderboardScoreListResponse
, plslrNextPageToken
, plslrKind
, plslrItems
, plslrPlayer
, InstanceIosDetails
, instanceIosDetails
, iidItunesAppId
, iidPreferredForIPad
, iidSupportIPhone
, iidKind
, iidSupportIPad
, iidPreferredForIPhone
, iidBundleIdentifier
, EventUpdateResponse
, eventUpdateResponse
, eurPlayerEvents
, eurBatchFailures
, eurEventFailures
, eurKind
, RevisionCheckResponse
, revisionCheckResponse
, rcrAPIVersion
, rcrKind
, rcrRevisionStatus
, ParticipantResult
, participantResult
, prParticipantId
, prKind
, prResult
, prPlacing
, Leaderboard
, leaderboard
, lKind
, lIsIconURLDefault
, lName
, lId
, lIconURL
, lOrder
, MetagameConfig
, metagameConfig
, mcKind
, mcCurrentVersion
, mcPlayerLevels
, CategoryListResponse
, categoryListResponse
, clrNextPageToken
, clrKind
, clrItems
, RoomP2PStatus
, roomP2PStatus
, rppsStatus
, rppsParticipantId
, rppsKind
, rppsError
, rppsErrorReason
, rppsConnectionSetupLatencyMillis
, rppsUnreliableRoundtripLatencyMillis
, TurnBasedMatchModification
, turnBasedMatchModification
, tbmmParticipantId
, tbmmKind
, tbmmModifiedTimestampMillis
, EventDefinition
, eventDefinition
, edIsDefaultImageURL
, edKind
, edVisibility
, edImageURL
, edDisplayName
, edId
, edChildEvents
, edDescription
, RoomModification
, roomModification
, rmParticipantId
, rmKind
, rmModifiedTimestampMillis
, ScoresListWindowTimeSpan (..)
, EventUpdateRequest
, eventUpdateRequest
, eUpdateCount
, eKind
, eDefinitionId
, AchievementUnlockResponse
, achievementUnlockResponse
, achKind
, achNewlyUnlocked
, ScoresGetTimeSpan (..)
, PlayerAchievement
, playerAchievement
, paKind
, paAchievementState
, paFormattedCurrentStepsString
, paExperiencePoints
, paId
, paCurrentSteps
, paLastUpdatedTimestamp
, RoomP2PStatuses
, roomP2PStatuses
, rppssKind
, rppssUpdates
, ImageAsset
, imageAsset
, iaHeight
, iaKind
, iaURL
, iaWidth
, iaName
, AchievementUpdateMultipleRequest
, achievementUpdateMultipleRequest
, aumruKind
, aumruUpdates
, RoomAutoMatchStatus
, roomAutoMatchStatus
, ramsKind
, ramsWaitEstimateSeconds
, AchievementUpdateRequest
, achievementUpdateRequest
, auruAchievementId
, auruKind
, auruUpdateType
, auruSetStepsAtLeastPayload
, auruIncrementPayload
, ScoresGetIncludeRankType (..)
, LeaderboardScoreRank
, leaderboardScoreRank
, lsrNumScores
, lsrKind
, lsrFormattedRank
, lsrFormattedNumScores
, lsrRank
, RoomCreateRequest
, roomCreateRequest
, rooRequestId
, rooVariant
, rooNetworkDiagnostics
, rooKind
, rooInvitedPlayerIds
, rooClientAddress
, rooAutoMatchingCriteria
, rooCapabilities
, PlayerListResponse
, playerListResponse
, plrNextPageToken
, plrKind
, plrItems
, LeaderboardScores
, leaderboardScores
, lsNextPageToken
, lsNumScores
, lsKind
, lsPlayerScore
, lsItems
, lsPrevPageToken
, AchievementDefinition
, achievementDefinition
, adAchievementType
, adFormattedTotalSteps
, adRevealedIconURL
, adKind
, adExperiencePoints
, adInitialState
, adName
, adId
, adIsUnlockedIconURLDefault
, adTotalSteps
, adDescription
, adIsRevealedIconURLDefault
, adUnlockedIconURL
, TurnBasedMatchCreateRequest
, turnBasedMatchCreateRequest
, tbmcrRequestId
, tbmcrVariant
, tbmcrKind
, tbmcrInvitedPlayerIds
, tbmcrAutoMatchingCriteria
, EventBatchRecordFailure
, eventBatchRecordFailure
, ebrfKind
, ebrfRange
, ebrfFailureCause
, TurnBasedMatchResults
, turnBasedMatchResults
, tbmrResults
, tbmrKind
, tbmrData
, tbmrMatchVersion
, PushTokenIdIos
, pushTokenIdIos
, ptiiAPNSDeviceToken
, ptiiAPNSEnvironment
, RoomLeaveRequest
, roomLeaveRequest
, rlrKind
, rlrReason
, rlrLeaveDiagnostics
, Played
, played
, pKind
, pAutoMatched
, pTimeMillis
, AchievementIncrementResponse
, achievementIncrementResponse
, airKind
, airNewlyUnlocked
, airCurrentSteps
, AchievementRevealResponse
, achievementRevealResponse
, arrKind
, arrCurrentState
, AchievementSetStepsAtLeastResponse
, achievementSetStepsAtLeastResponse
, assalrKind
, assalrNewlyUnlocked
, assalrCurrentSteps
, PlayerAchievementListResponse
, playerAchievementListResponse
, palrNextPageToken
, palrKind
, palrItems
, EventRecordRequest
, eventRecordRequest
, errRequestId
, errKind
, errCurrentTimeMillis
, errTimePeriods
, RoomAutoMatchingCriteria
, roomAutoMatchingCriteria
, ramcKind
, ramcExclusiveBitmask
, ramcMaxAutoMatchingPlayers
, ramcMinAutoMatchingPlayers
, ScoresListTimeSpan (..)
, QuestMilestone
, questMilestone
, qmState
, qmKind
, qmId
, qmCompletionRewardData
, qmCriteria
, PeerSessionDiagnostics
, peerSessionDiagnostics
, psdConnectedTimestampMillis
, psdParticipantId
, psdKind
, psdUnreliableChannel
, psdReliableChannel
, PushTokenId
, pushTokenId
, ptiIos
, ptiKind
, EventPeriodUpdate
, eventPeriodUpdate
, epuKind
, epuTimePeriod
, epuUpdates
, TurnBasedMatchSync
, turnBasedMatchSync
, tbmsMoreAvailable
, tbmsNextPageToken
, tbmsKind
, tbmsItems
, ScoreSubmission
, scoreSubmission
, scoSignature
, scoScoreTag
, scoScore
, scoKind
, scoLeaderboardId
, RoomLeaveDiagnostics
, roomLeaveDiagnostics
, rldPeerSession
, rldAndroidNetworkType
, rldKind
, rldNetworkOperatorCode
, rldNetworkOperatorName
, rldSocketsUsed
, rldIosNetworkType
, rldAndroidNetworkSubtype
, AggregateStats
, aggregateStats
, asMax
, asKind
, asCount
, asMin
, asSum
, InstanceWebDetails
, instanceWebDetails
, iwdPreferred
, iwdKind
, iwdLaunchURL
, TurnBasedMatchRematch
, turnBasedMatchRematch
, tRematch
, tKind
, tPreviousMatch
, PlayerExperienceInfo
, playerExperienceInfo
, peiKind
, peiCurrentExperiencePoints
, peiCurrentLevel
, peiNextLevel
, peiLastLevelUpTimestampMillis
, GamesAchievementSetStepsAtLeast
, gamesAchievementSetStepsAtLeast
, gassalKind
, gassalSteps
, Player
, player
, plaBannerURLLandscape
, plaLastPlayedWith
, plaAvatarImageURL
, plaKind
, plaExperienceInfo
, plaName
, plaOriginalPlayerId
, plaDisplayName
, plaTitle
, plaBannerURLPortrait
, plaPlayerId
, plaProFileSettings
, GamesAchievementIncrement
, gamesAchievementIncrement
, gaiRequestId
, gaiKind
, gaiSteps
, Quest
, quest
, queLastUpdatedTimestampMillis
, queBannerURL
, queState
, queMilestones
, queKind
, queApplicationId
, queEndTimestampMillis
, queName
, queId
, queIconURL
, queStartTimestampMillis
, queNotifyTimestampMillis
, queDescription
, queIsDefaultBannerURL
, queIsDefaultIconURL
, queAcceptedTimestampMillis
, EventChild
, eventChild
, ecKind
, ecChildId
, ApplicationVerifyResponse
, applicationVerifyResponse
, avrKind
, avrAlternatePlayerId
, avrPlayerId
, PlayerEventListResponse
, playerEventListResponse
, pelrNextPageToken
, pelrKind
, pelrItems
, TurnBasedMatchDataRequest
, turnBasedMatchDataRequest
, tbmdrKind
, tbmdrData
, ProFileSettings
, proFileSettings
, pfsProFileVisible
, pfsKind
, EventPeriodRange
, eventPeriodRange
, eprKind
, eprPeriodStartMillis
, eprPeriodEndMillis
, MetagameListCategoriesByPlayerCollection (..)
, AchievementsListState (..)
, EventRecordFailure
, eventRecordFailure
, erfKind
, erfFailureCause
, erfEventId
, PlayerScoreSubmissionList
, playerScoreSubmissionList
, psslKind
, psslScores
, Instance
, instance'
, iAndroidInstance
, iKind
, iWebInstance
, iIosInstance
, iName
, iAcquisitionURI
, iPlatformType
, iTurnBasedPlay
, iRealtimePlay
) where
import Network.Google.Games.Types.Product
import Network.Google.Games.Types.Sum
import Network.Google.Prelude
gamesService :: ServiceConfig
gamesService
= defaultService (ServiceId "games:v1")
"www.googleapis.com"
gamesScope :: Proxy '["https://www.googleapis.com/auth/games"]
gamesScope = Proxy;
driveAppDataScope :: Proxy '["https://www.googleapis.com/auth/drive.appdata"]
driveAppDataScope = Proxy;