{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.Script.Types
(
scriptService
, mailGoogleComScope
, m8FeedsScope
, adminDirectoryUserScope
, scriptProjectsScope
, userInfoEmailScope
, scriptMetricsScope
, formsCurrentOnlyScope
, scriptDeploymentsScope
, driveScope
, adminDirectoryGroupScope
, scriptProjectsReadOnlyScope
, calendarFeedsScope
, formsScope
, spreadsheetsScope
, scriptDeploymentsReadOnlyScope
, groupsScope
, scriptProcessesScope
, documentsScope
, 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.Script.Types.Product
import Network.Google.Script.Types.Sum
scriptService :: ServiceConfig
scriptService
= defaultService (ServiceId "script:v1")
"script.googleapis.com"
mailGoogleComScope :: Proxy '["https://mail.google.com/"]
mailGoogleComScope = Proxy;
m8FeedsScope :: Proxy '["https://www.google.com/m8/feeds"]
m8FeedsScope = Proxy;
adminDirectoryUserScope :: Proxy '["https://www.googleapis.com/auth/admin.directory.user"]
adminDirectoryUserScope = Proxy;
scriptProjectsScope :: Proxy '["https://www.googleapis.com/auth/script.projects"]
scriptProjectsScope = Proxy;
userInfoEmailScope :: Proxy '["https://www.googleapis.com/auth/userinfo.email"]
userInfoEmailScope = Proxy;
scriptMetricsScope :: Proxy '["https://www.googleapis.com/auth/script.metrics"]
scriptMetricsScope = Proxy;
formsCurrentOnlyScope :: Proxy '["https://www.googleapis.com/auth/forms.currentonly"]
formsCurrentOnlyScope = Proxy;
scriptDeploymentsScope :: Proxy '["https://www.googleapis.com/auth/script.deployments"]
scriptDeploymentsScope = Proxy;
driveScope :: Proxy '["https://www.googleapis.com/auth/drive"]
driveScope = Proxy;
adminDirectoryGroupScope :: Proxy '["https://www.googleapis.com/auth/admin.directory.group"]
adminDirectoryGroupScope = Proxy;
scriptProjectsReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/script.projects.readonly"]
scriptProjectsReadOnlyScope = Proxy;
calendarFeedsScope :: Proxy '["https://www.google.com/calendar/feeds"]
calendarFeedsScope = Proxy;
formsScope :: Proxy '["https://www.googleapis.com/auth/forms"]
formsScope = Proxy;
spreadsheetsScope :: Proxy '["https://www.googleapis.com/auth/spreadsheets"]
spreadsheetsScope = Proxy;
scriptDeploymentsReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/script.deployments.readonly"]
scriptDeploymentsReadOnlyScope = Proxy;
groupsScope :: Proxy '["https://www.googleapis.com/auth/groups"]
groupsScope = Proxy;
scriptProcessesScope :: Proxy '["https://www.googleapis.com/auth/script.processes"]
scriptProcessesScope = Proxy;
documentsScope :: Proxy '["https://www.googleapis.com/auth/documents"]
documentsScope = Proxy;