{-# LANGUAGE DataKinds #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.Script
(
scriptService
, mailGoogleComScope
, m8FeedsScope
, adminDirectoryUserScope
, scriptProjectsScope
, userInfoEmailScope
, scriptMetricsScope
, formsCurrentOnlyScope
, scriptDeploymentsScope
, driveScope
, adminDirectoryGroupScope
, scriptProjectsReadOnlyScope
, calendarFeedsScope
, formsScope
, spreadsheetsScope
, scriptDeploymentsReadOnlyScope
, groupsScope
, scriptProcessesScope
, documentsScope
, ScriptAPI
, module Network.Google.Resource.Script.Processes.List
, module Network.Google.Resource.Script.Processes.ListScriptProcesses
, module Network.Google.Resource.Script.Projects.Create
, module Network.Google.Resource.Script.Projects.Deployments.Create
, module Network.Google.Resource.Script.Projects.Deployments.Delete
, module Network.Google.Resource.Script.Projects.Deployments.Get
, module Network.Google.Resource.Script.Projects.Deployments.List
, module Network.Google.Resource.Script.Projects.Deployments.Update
, module Network.Google.Resource.Script.Projects.Get
, module Network.Google.Resource.Script.Projects.GetContent
, module Network.Google.Resource.Script.Projects.GetMetrics
, module Network.Google.Resource.Script.Projects.UpdateContent
, module Network.Google.Resource.Script.Projects.Versions.Create
, module Network.Google.Resource.Script.Projects.Versions.Get
, module Network.Google.Resource.Script.Projects.Versions.List
, module Network.Google.Resource.Script.Scripts.Run
, GoogleAppsScriptTypeFunctionSet
, googleAppsScriptTypeFunctionSet
, gastfsValues
, GoogleAppsScriptTypeExecutionAPIConfig
, googleAppsScriptTypeExecutionAPIConfig
, gasteacAccess
, GoogleAppsScriptTypeProcessProcessType (..)
, Status
, status
, sDetails
, sCode
, sMessage
, GoogleAppsScriptTypeProcessUserAccessLevel (..)
, Metrics
, metrics
, mActiveUsers
, mFailedExecutions
, mTotalExecutions
, GoogleAppsScriptTypeProcess
, googleAppsScriptTypeProcess
, gastpProcessStatus
, gastpStartTime
, gastpProjectName
, gastpFunctionName
, gastpUserAccessLevel
, gastpProcessType
, gastpExecutingUser
, gastpDuration
, GoogleAppsScriptTypeWebAppConfigExecuteAs (..)
, Project
, project
, pCreator
, pLastModifyUser
, pUpdateTime
, pScriptId
, pTitle
, pParentId
, pCreateTime
, Operation
, operation
, oDone
, oError
, oResponse
, ListUserProcessesResponse
, listUserProcessesResponse
, luprNextPageToken
, luprProcesses
, Empty
, empty
, GoogleAppsScriptTypeUser
, googleAppsScriptTypeUser
, gastuEmail
, gastuPhotoURL
, gastuDomain
, gastuName
, EntryPoint
, entryPoint
, epExecutionAPI
, epAddOn
, epEntryPointType
, epWebApp
, ListVersionsResponse
, listVersionsResponse
, lvrNextPageToken
, lvrVersions
, GoogleAppsScriptTypeExecutionAPIConfigAccess (..)
, ExecutionRequest
, executionRequest
, erFunction
, erSessionState
, erDevMode
, erParameters
, ListScriptProcessesResponse
, listScriptProcessesResponse
, lsprNextPageToken
, lsprProcesses
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, FileType (..)
, ScriptStackTraceElement
, scriptStackTraceElement
, ssteFunction
, ssteLineNumber
, Content
, content
, cScriptId
, cFiles
, GoogleAppsScriptTypeAddOnEntryPointAddOnType (..)
, MetricsValue
, metricsValue
, mvStartTime
, mvValue
, mvEndTime
, GoogleAppsScriptTypeAddOnEntryPoint
, googleAppsScriptTypeAddOnEntryPoint
, gastaoepPostInstallTipURL
, gastaoepAddOnType
, gastaoepReportIssueURL
, gastaoepHelpURL
, gastaoepTitle
, gastaoepDescription
, GoogleAppsScriptTypeWebAppConfig
, googleAppsScriptTypeWebAppConfig
, gastwacAccess
, gastwacExecuteAs
, Version
, version
, vVersionNumber
, vScriptId
, vDescription
, vCreateTime
, Xgafv (..)
, ExecutionError
, executionError
, eeScriptStackTraceElements
, eeErrorType
, eeErrorMessage
, GoogleAppsScriptTypeWebAppEntryPoint
, googleAppsScriptTypeWebAppEntryPoint
, gastwaepEntryPointConfig
, gastwaepURL
, EntryPointEntryPointType (..)
, CreateProjectRequest
, createProjectRequest
, cprTitle
, cprParentId
, GoogleAppsScriptTypeProcessProcessStatus (..)
, DeploymentConfig
, deploymentConfig
, dcVersionNumber
, dcScriptId
, dcManifestFileName
, dcDescription
, GoogleAppsScriptTypeWebAppConfigAccess (..)
, ListDeploymentsResponse
, listDeploymentsResponse
, ldrNextPageToken
, ldrDeployments
, GoogleAppsScriptTypeFunction
, googleAppsScriptTypeFunction
, gastfName
, File
, file
, fFunctionSet
, fLastModifyUser
, fUpdateTime
, fName
, fSource
, fType
, fCreateTime
, GoogleAppsScriptTypeExecutionAPIEntryPoint
, googleAppsScriptTypeExecutionAPIEntryPoint
, gasteaepEntryPointConfig
, OperationResponse
, operationResponse
, orAddtional
, ExecutionResponse
, executionResponse
, erResult
, Deployment
, deployment
, dDeploymentId
, dUpdateTime
, dEntryPoints
, dDeploymentConfig
, UpdateDeploymentRequest
, updateDeploymentRequest
, udrDeploymentConfig
) where
import Network.Google.Prelude
import Network.Google.Resource.Script.Processes.List
import Network.Google.Resource.Script.Processes.ListScriptProcesses
import Network.Google.Resource.Script.Projects.Create
import Network.Google.Resource.Script.Projects.Deployments.Create
import Network.Google.Resource.Script.Projects.Deployments.Delete
import Network.Google.Resource.Script.Projects.Deployments.Get
import Network.Google.Resource.Script.Projects.Deployments.List
import Network.Google.Resource.Script.Projects.Deployments.Update
import Network.Google.Resource.Script.Projects.Get
import Network.Google.Resource.Script.Projects.GetContent
import Network.Google.Resource.Script.Projects.GetMetrics
import Network.Google.Resource.Script.Projects.UpdateContent
import Network.Google.Resource.Script.Projects.Versions.Create
import Network.Google.Resource.Script.Projects.Versions.Get
import Network.Google.Resource.Script.Projects.Versions.List
import Network.Google.Resource.Script.Scripts.Run
import Network.Google.Script.Types
type ScriptAPI =
ScriptsRunResource :<|> ProcessesListResource :<|>
ProcessesListScriptProcessesResource
:<|> ProjectsVersionsListResource
:<|> ProjectsVersionsGetResource
:<|> ProjectsVersionsCreateResource
:<|> ProjectsDeploymentsListResource
:<|> ProjectsDeploymentsGetResource
:<|> ProjectsDeploymentsCreateResource
:<|> ProjectsDeploymentsDeleteResource
:<|> ProjectsDeploymentsUpdateResource
:<|> ProjectsUpdateContentResource
:<|> ProjectsGetResource
:<|> ProjectsCreateResource
:<|> ProjectsGetContentResource
:<|> ProjectsGetMetricsResource