{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Testing.Types
(
testingService
, cloudPlatformReadOnlyScope
, cloudPlatformScope
, TestDetails
, testDetails
, tdProgressMessages
, tdErrorMessage
, IntentFilter
, intentFilter
, ifActionNames
, ifMimeType
, ifCategoryNames
, IosTestSetup
, iosTestSetup
, itsNetworkProFile
, TestExecution
, testExecution
, teTestDetails
, teState
, teEnvironment
, teTestSpecification
, teMatrixId
, teId
, teProjectId
, teToolResultsStep
, teTimestamp
, IosVersion
, iosVersion
, ivMinorVersion
, ivMajorVersion
, ivSupportedXcodeVersionIds
, ivId
, ivTags
, IosDeviceList
, iosDeviceList
, idlIosDevices
, RoboDirective
, roboDirective
, rdResourceName
, rdInputText
, rdActionType
, AndroidRuntimeConfiguration
, androidRuntimeConfiguration
, arcOrientations
, arcLocales
, XcodeVersion
, xcodeVersion
, xvVersion
, xvTags
, Distribution
, distribution
, dMeasurementTime
, dMarketShare
, TestMatrixState (..)
, IosModel
, iosModel
, imFormFactor
, imName
, imSupportedVersionIds
, imId
, imDeviceCapabilities
, imTags
, APK
, aPK
, aPackageName
, aLocation
, NetworkConfigurationCatalog
, networkConfigurationCatalog
, nccConfigurations
, TestMatrixInvalidMatrixDetails (..)
, IosDevice
, iosDevice
, idLocale
, idIosModelId
, idIosVersionId
, idOrientation
, GetAPKDetailsResponse
, getAPKDetailsResponse
, gapkdrAPKDetail
, AndroidRoboTest
, androidRoboTest
, artRoboDirectives
, artRoboScript
, artStartingIntents
, artAppInitialActivity
, artMaxSteps
, artAppPackageId
, artAppBundle
, artAppAPK
, artMaxDepth
, FileReference
, fileReference
, frGcsPath
, Environment
, environment
, eIosDevice
, eAndroidDevice
, ToolResultsHistory
, toolResultsHistory
, trhHistoryId
, trhProjectId
, TestEnvironmentCatalog
, testEnvironmentCatalog
, tecSoftwareCatalog
, tecNetworkConfigurationCatalog
, tecAndroidDeviceCatalog
, tecIosDeviceCatalog
, Locale
, locale
, lName
, lId
, lRegion
, lTags
, AndroidDeviceCatalog
, androidDeviceCatalog
, adcVersions
, adcModels
, adcRuntimeConfiguration
, AndroidInstrumentationTestOrchestratorOption (..)
, TestExecutionState (..)
, TestSpecification
, testSpecification
, tsIosTestSetup
, tsTestTimeout
, tsAndroidRoboTest
, tsAutoGoogleLogin
, tsDisableVideoRecording
, tsAndroidInstrumentationTest
, tsIosXcTest
, tsDisablePerformanceMetrics
, tsTestSetup
, tsAndroidTestLoop
, ProvidedSoftwareCatalog
, providedSoftwareCatalog
, pscOrchestratorVersion
, TrafficRule
, trafficRule
, trPacketLossRatio
, trPacketDuplicationRatio
, trBandwidth
, trBurst
, trDelay
, IosDeviceCatalog
, iosDeviceCatalog
, idcXcodeVersions
, idcVersions
, idcModels
, idcRuntimeConfiguration
, GoogleAuto
, googleAuto
, CancelTestMatrixResponseTestState (..)
, Account
, account
, aGoogleAuto
, RoboDirectiveActionType (..)
, StartActivityIntent
, startActivityIntent
, saiURI
, saiCategories
, saiAction
, IosModelFormFactor (..)
, RoboStartingIntent
, roboStartingIntent
, rsiLauncherActivity
, rsiStartActivity
, Date
, date
, dDay
, dYear
, dMonth
, RegularFile
, regularFile
, rfDevicePath
, rfContent
, AndroidModel
, androidModel
, amSupportedAbis
, amManufacturer
, amCodename
, amLowFpsVideoRecording
, amFormFactor
, amBrand
, amScreenX
, amScreenDensity
, amName
, amSupportedVersionIds
, amScreenY
, amId
, amForm
, amTags
, ClientInfo
, clientInfo
, ciName
, ciClientInfoDetails
, AndroidModelFormFactor (..)
, AndroidModelForm (..)
, Xgafv (..)
, APKManifest
, aPKManifest
, apkmApplicationLabel
, apkmMinSdkVersion
, apkmPackageName
, apkmIntentFilters
, apkmMaxSdkVersion
, AppBundle
, appBundle
, abBundleLocation
, AndroidInstrumentationTest
, androidInstrumentationTest
, aitTestTargets
, aitTestRunnerClass
, aitAppPackageId
, aitTestAPK
, aitOrchestratorOption
, aitAppBundle
, aitAppAPK
, aitTestPackageId
, TestMatrix
, testMatrix
, tmState
, tmTestMatrixId
, tmTestSpecification
, tmFlakyTestAttempts
, tmClientInfo
, tmTestExecutions
, tmResultStorage
, tmInvalidMatrixDetails
, tmProjectId
, tmEnvironmentMatrix
, tmTimestamp
, CancelTestMatrixResponse
, cancelTestMatrixResponse
, ctmrTestState
, ToolResultsExecution
, toolResultsExecution
, treExecutionId
, treHistoryId
, treProjectId
, IosXcTest
, iosXcTest
, ixtXctestrun
, ixtXcodeVersion
, ixtAppBundleId
, ixtTestsZip
, ResultStorage
, resultStorage
, rsToolResultsHistory
, rsToolResultsExecution
, rsGoogleCloudStorage
, AndroidMatrix
, androidMatrix
, amAndroidModelIds
, amAndroidVersionIds
, amOrientations
, amLocales
, ToolResultsStep
, toolResultsStep
, trsExecutionId
, trsStepId
, trsHistoryId
, trsProjectId
, LauncherActivityIntent
, launcherActivityIntent
, APKDetail
, aPKDetail
, apkdAPKManifest
, AndroidDevice
, androidDevice
, adAndroidVersionId
, adLocale
, adAndroidModelId
, adOrientation
, EnvironmentVariable
, environmentVariable
, evValue
, evKey
, Orientation
, orientation
, oName
, oId
, oTags
, EnvironmentMatrix
, environmentMatrix
, emIosDeviceList
, emAndroidMatrix
, emAndroidDeviceList
, DeviceFile
, deviceFile
, dfRegularFile
, dfObbFile
, ClientInfoDetail
, clientInfoDetail
, cidValue
, cidKey
, NetworkConfiguration
, networkConfiguration
, ncDownRule
, ncId
, ncUpRule
, IosRuntimeConfiguration
, iosRuntimeConfiguration
, ircOrientations
, ircLocales
, GoogleCloudStorage
, googleCloudStorage
, gcsGcsPath
, AndroidVersion
, androidVersion
, avCodeName
, avDistribution
, avAPILevel
, avVersionString
, avId
, avReleaseDate
, avTags
, ObbFile
, obbFile
, ofObb
, ofObbFileName
, AndroidTestLoop
, androidTestLoop
, atlScenarios
, atlScenarioLabels
, atlAppPackageId
, atlAppBundle
, atlAppAPK
, AndroidDeviceList
, androidDeviceList
, adlAndroidDevices
, TestSetup
, testSetup
, tsAccount
, tsNetworkProFile
, tsEnvironmentVariables
, tsAdditionalAPKs
, tsFilesToPush
, tsDirectoriesToPull
) where
import Network.Google.Prelude
import Network.Google.Testing.Types.Product
import Network.Google.Testing.Types.Sum
testingService :: ServiceConfig
testingService
= defaultService (ServiceId "testing:v1")
"testing.googleapis.com"
cloudPlatformReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform.read-only"]
cloudPlatformReadOnlyScope = Proxy;
cloudPlatformScope :: Proxy '["https://www.googleapis.com/auth/cloud-platform"]
cloudPlatformScope = Proxy;