gogol-drive-0.3.0: Google Drive SDK.

Copyright(c) 2015-2016 Brendan Hay
LicenseMozilla Public License, v. 2.0.
MaintainerBrendan Hay <brendan.g.hay@gmail.com>
Stabilityauto-generated
Portabilitynon-portable (GHC extensions)
Safe HaskellNone
LanguageHaskell2010

Network.Google.Drive.Types

Contents

Description

 

Synopsis

Service Configuration

driveService :: ServiceConfig Source #

Default request referring to version v3 of the Drive API. This contains the host and root path used as a starting point for constructing service requests.

OAuth Scopes

driveMetadataReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/drive.metadata.readonly"] Source #

View metadata for files in your Google Drive

drivePhotosReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/drive.photos.readonly"] Source #

View the photos, videos and albums in your Google Photos

driveAppDataScope :: Proxy '["https://www.googleapis.com/auth/drive.appdata"] Source #

View and manage its own configuration data in your Google Drive

driveReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/drive.readonly"] Source #

View the files in your Google Drive

driveScope :: Proxy '["https://www.googleapis.com/auth/drive"] Source #

View and manage the files in your Google Drive

driveFileScope :: Proxy '["https://www.googleapis.com/auth/drive.file"] Source #

View and manage Google Drive files and folders that you have opened or created with this app

driveMetadataScope :: Proxy '["https://www.googleapis.com/auth/drive.metadata"] Source #

View and manage metadata of files in your Google Drive

driveScriptsScope :: Proxy '["https://www.googleapis.com/auth/drive.scripts"] Source #

Modify your Google Apps Script scripts' behavior

FileList

data FileList Source #

A list of files.

See: fileList smart constructor.

Instances

Eq FileList Source # 
Data FileList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileList -> c FileList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileList #

toConstr :: FileList -> Constr #

dataTypeOf :: FileList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileList) #

gmapT :: (forall b. Data b => b -> b) -> FileList -> FileList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileList -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileList -> m FileList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileList -> m FileList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileList -> m FileList #

Show FileList Source # 
Generic FileList Source # 

Associated Types

type Rep FileList :: * -> * #

Methods

from :: FileList -> Rep FileList x #

to :: Rep FileList x -> FileList #

ToJSON FileList Source # 
FromJSON FileList Source # 
type Rep FileList Source # 
type Rep FileList = D1 (MetaData "FileList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_flNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_flKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_flFiles") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [File]))))))

fileList :: FileList Source #

Creates a value of FileList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

flNextPageToken :: Lens' FileList (Maybe Text) Source #

The page token for the next page of files. This will be absent if the end of the files list has been reached. If the token is rejected for any reason, it should be discarded, and pagination should be restarted from the first page of results.

flKind :: Lens' FileList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#fileList".

flFiles :: Lens' FileList [File] Source #

The list of files. If nextPageToken is populated, then this list may be incomplete and an additional page of results should be fetched.

FilesListCorpus

data FilesListCorpus Source #

The source of files to list.

Constructors

FLCDomain

domain Files shared to the user's domain.

FLCUser

user Files owned by or shared to the user.

Instances

Enum FilesListCorpus Source # 
Eq FilesListCorpus Source # 
Data FilesListCorpus Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FilesListCorpus -> c FilesListCorpus #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FilesListCorpus #

toConstr :: FilesListCorpus -> Constr #

dataTypeOf :: FilesListCorpus -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FilesListCorpus) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilesListCorpus) #

gmapT :: (forall b. Data b => b -> b) -> FilesListCorpus -> FilesListCorpus #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FilesListCorpus -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FilesListCorpus -> r #

gmapQ :: (forall d. Data d => d -> u) -> FilesListCorpus -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FilesListCorpus -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FilesListCorpus -> m FilesListCorpus #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FilesListCorpus -> m FilesListCorpus #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FilesListCorpus -> m FilesListCorpus #

Ord FilesListCorpus Source # 
Read FilesListCorpus Source # 
Show FilesListCorpus Source # 
Generic FilesListCorpus Source # 
Hashable FilesListCorpus Source # 
ToJSON FilesListCorpus Source # 
FromJSON FilesListCorpus Source # 
FromHttpApiData FilesListCorpus Source # 
ToHttpApiData FilesListCorpus Source # 
type Rep FilesListCorpus Source # 
type Rep FilesListCorpus = D1 (MetaData "FilesListCorpus" "Network.Google.Drive.Types.Sum" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) ((:+:) (C1 (MetaCons "FLCDomain" PrefixI False) U1) (C1 (MetaCons "FLCUser" PrefixI False) U1))

CommentQuotedFileContent

data CommentQuotedFileContent Source #

The file content to which the comment refers, typically within the anchor region. For a text file, for example, this would be the text at the location of the comment.

See: commentQuotedFileContent smart constructor.

Instances

Eq CommentQuotedFileContent Source # 
Data CommentQuotedFileContent Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CommentQuotedFileContent -> c CommentQuotedFileContent #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CommentQuotedFileContent #

toConstr :: CommentQuotedFileContent -> Constr #

dataTypeOf :: CommentQuotedFileContent -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c CommentQuotedFileContent) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CommentQuotedFileContent) #

gmapT :: (forall b. Data b => b -> b) -> CommentQuotedFileContent -> CommentQuotedFileContent #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CommentQuotedFileContent -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CommentQuotedFileContent -> r #

gmapQ :: (forall d. Data d => d -> u) -> CommentQuotedFileContent -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CommentQuotedFileContent -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CommentQuotedFileContent -> m CommentQuotedFileContent #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CommentQuotedFileContent -> m CommentQuotedFileContent #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CommentQuotedFileContent -> m CommentQuotedFileContent #

Show CommentQuotedFileContent Source # 
Generic CommentQuotedFileContent Source # 
ToJSON CommentQuotedFileContent Source # 
FromJSON CommentQuotedFileContent Source # 
type Rep CommentQuotedFileContent Source # 
type Rep CommentQuotedFileContent = D1 (MetaData "CommentQuotedFileContent" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "CommentQuotedFileContent'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_cqfcValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_cqfcMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

commentQuotedFileContent :: CommentQuotedFileContent Source #

Creates a value of CommentQuotedFileContent with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cqfcValue :: Lens' CommentQuotedFileContent (Maybe Text) Source #

The quoted content itself. This is interpreted as plain text if set through the API.

cqfcMimeType :: Lens' CommentQuotedFileContent (Maybe Text) Source #

The MIME type of the quoted content.

AboutStorageQuota

data AboutStorageQuota Source #

The user's storage quota limits and usage. All fields are measured in bytes.

See: aboutStorageQuota smart constructor.

Instances

Eq AboutStorageQuota Source # 
Data AboutStorageQuota Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AboutStorageQuota -> c AboutStorageQuota #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AboutStorageQuota #

toConstr :: AboutStorageQuota -> Constr #

dataTypeOf :: AboutStorageQuota -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AboutStorageQuota) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AboutStorageQuota) #

gmapT :: (forall b. Data b => b -> b) -> AboutStorageQuota -> AboutStorageQuota #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AboutStorageQuota -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AboutStorageQuota -> r #

gmapQ :: (forall d. Data d => d -> u) -> AboutStorageQuota -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AboutStorageQuota -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AboutStorageQuota -> m AboutStorageQuota #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutStorageQuota -> m AboutStorageQuota #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutStorageQuota -> m AboutStorageQuota #

Show AboutStorageQuota Source # 
Generic AboutStorageQuota Source # 
ToJSON AboutStorageQuota Source # 
FromJSON AboutStorageQuota Source # 
type Rep AboutStorageQuota Source # 
type Rep AboutStorageQuota = D1 (MetaData "AboutStorageQuota" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "AboutStorageQuota'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_asqUsageInDriveTrash") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_asqLimit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_asqUsage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_asqUsageInDrive") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

aboutStorageQuota :: AboutStorageQuota Source #

Creates a value of AboutStorageQuota with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

asqUsageInDriveTrash :: Lens' AboutStorageQuota (Maybe Int64) Source #

The usage by trashed files in Google Drive.

asqLimit :: Lens' AboutStorageQuota (Maybe Int64) Source #

The usage limit, if applicable. This will not be present if the user has unlimited storage.

asqUsage :: Lens' AboutStorageQuota (Maybe Int64) Source #

The total usage across all services.

asqUsageInDrive :: Lens' AboutStorageQuota (Maybe Int64) Source #

The usage by all files in Google Drive.

Reply

data Reply Source #

A reply to a comment on a file.

See: reply smart constructor.

Instances

Eq Reply Source # 

Methods

(==) :: Reply -> Reply -> Bool #

(/=) :: Reply -> Reply -> Bool #

Data Reply Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Reply -> c Reply #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Reply #

toConstr :: Reply -> Constr #

dataTypeOf :: Reply -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Reply) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Reply) #

gmapT :: (forall b. Data b => b -> b) -> Reply -> Reply #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Reply -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Reply -> r #

gmapQ :: (forall d. Data d => d -> u) -> Reply -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Reply -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Reply -> m Reply #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Reply -> m Reply #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Reply -> m Reply #

Show Reply Source # 

Methods

showsPrec :: Int -> Reply -> ShowS #

show :: Reply -> String #

showList :: [Reply] -> ShowS #

Generic Reply Source # 

Associated Types

type Rep Reply :: * -> * #

Methods

from :: Reply -> Rep Reply x #

to :: Rep Reply x -> Reply #

ToJSON Reply Source # 
FromJSON Reply Source # 
type Rep Reply Source # 

reply :: Reply Source #

Creates a value of Reply with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rHTMLContent :: Lens' Reply (Maybe Text) Source #

The content of the reply with HTML formatting.

rModifiedTime :: Lens' Reply (Maybe UTCTime) Source #

The last time the reply was modified (RFC 3339 date-time).

rCreatedTime :: Lens' Reply (Maybe UTCTime) Source #

The time at which the reply was created (RFC 3339 date-time).

rKind :: Lens' Reply Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#reply".

rAction :: Lens' Reply (Maybe Text) Source #

The action the reply performed to the parent comment. Valid values are: - resolve - reopen

rContent :: Lens' Reply (Maybe Text) Source #

The plain text content of the reply. This field is used for setting the content, while htmlContent should be displayed. This is required on creates if no action is specified.

rAuthor :: Lens' Reply (Maybe User) Source #

The user who created the reply.

rId :: Lens' Reply (Maybe Text) Source #

The ID of the reply.

rDeleted :: Lens' Reply (Maybe Bool) Source #

Whether the reply has been deleted. A deleted reply has no content.

AboutImportFormats

data AboutImportFormats Source #

A map of source MIME type to possible targets for all supported imports.

See: aboutImportFormats smart constructor.

Instances

Eq AboutImportFormats Source # 
Data AboutImportFormats Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AboutImportFormats -> c AboutImportFormats #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AboutImportFormats #

toConstr :: AboutImportFormats -> Constr #

dataTypeOf :: AboutImportFormats -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AboutImportFormats) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AboutImportFormats) #

gmapT :: (forall b. Data b => b -> b) -> AboutImportFormats -> AboutImportFormats #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AboutImportFormats -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AboutImportFormats -> r #

gmapQ :: (forall d. Data d => d -> u) -> AboutImportFormats -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AboutImportFormats -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AboutImportFormats -> m AboutImportFormats #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutImportFormats -> m AboutImportFormats #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutImportFormats -> m AboutImportFormats #

Show AboutImportFormats Source # 
Generic AboutImportFormats Source # 
ToJSON AboutImportFormats Source # 
FromJSON AboutImportFormats Source # 
type Rep AboutImportFormats Source # 
type Rep AboutImportFormats = D1 (MetaData "AboutImportFormats" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "AboutImportFormats'" PrefixI True) (S1 (MetaSel (Just Symbol "_aifAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text [Text]))))

aboutImportFormats Source #

Creates a value of AboutImportFormats with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

FileCapabilities

data FileCapabilities Source #

Capabilities the current user has on the file.

See: fileCapabilities smart constructor.

Instances

Eq FileCapabilities Source # 
Data FileCapabilities Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileCapabilities -> c FileCapabilities #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileCapabilities #

toConstr :: FileCapabilities -> Constr #

dataTypeOf :: FileCapabilities -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileCapabilities) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileCapabilities) #

gmapT :: (forall b. Data b => b -> b) -> FileCapabilities -> FileCapabilities #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileCapabilities -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileCapabilities -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileCapabilities -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileCapabilities -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileCapabilities -> m FileCapabilities #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileCapabilities -> m FileCapabilities #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileCapabilities -> m FileCapabilities #

Show FileCapabilities Source # 
Generic FileCapabilities Source # 
ToJSON FileCapabilities Source # 
FromJSON FileCapabilities Source # 
type Rep FileCapabilities Source # 
type Rep FileCapabilities = D1 (MetaData "FileCapabilities" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileCapabilities'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fcCanComment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fcCanEdit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) ((:*:) (S1 (MetaSel (Just Symbol "_fcCanReadRevisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fcCanCopy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fcCanShare") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

fileCapabilities :: FileCapabilities Source #

Creates a value of FileCapabilities with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fcCanComment :: Lens' FileCapabilities (Maybe Bool) Source #

Whether the user can comment on the file.

fcCanEdit :: Lens' FileCapabilities (Maybe Bool) Source #

Whether the user can edit the file's content.

fcCanReadRevisions :: Lens' FileCapabilities (Maybe Bool) Source #

Whether the current user has read access to the Revisions resource of the file.

fcCanCopy :: Lens' FileCapabilities (Maybe Bool) Source #

Whether the user can copy the file.

fcCanShare :: Lens' FileCapabilities (Maybe Bool) Source #

Whether the user can modify the file's permissions and sharing settings.

ReplyList

data ReplyList Source #

A list of replies to a comment on a file.

See: replyList smart constructor.

Instances

Eq ReplyList Source # 
Data ReplyList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ReplyList -> c ReplyList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ReplyList #

toConstr :: ReplyList -> Constr #

dataTypeOf :: ReplyList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ReplyList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ReplyList) #

gmapT :: (forall b. Data b => b -> b) -> ReplyList -> ReplyList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ReplyList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ReplyList -> r #

gmapQ :: (forall d. Data d => d -> u) -> ReplyList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ReplyList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ReplyList -> m ReplyList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ReplyList -> m ReplyList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ReplyList -> m ReplyList #

Show ReplyList Source # 
Generic ReplyList Source # 

Associated Types

type Rep ReplyList :: * -> * #

ToJSON ReplyList Source # 
FromJSON ReplyList Source # 
type Rep ReplyList Source # 
type Rep ReplyList = D1 (MetaData "ReplyList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "ReplyList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_rlNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_rlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_rlReplies") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Reply]))))))

replyList :: ReplyList Source #

Creates a value of ReplyList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rlNextPageToken :: Lens' ReplyList (Maybe Text) Source #

The page token for the next page of replies. This will be absent if the end of the replies list has been reached. If the token is rejected for any reason, it should be discarded, and pagination should be restarted from the first page of results.

rlKind :: Lens' ReplyList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#replyList".

rlReplies :: Lens' ReplyList [Reply] Source #

The list of replies. If nextPageToken is populated, then this list may be incomplete and an additional page of results should be fetched.

FileContentHintsThumbnail

data FileContentHintsThumbnail Source #

A thumbnail for the file. This will only be used if Drive cannot generate a standard thumbnail.

See: fileContentHintsThumbnail smart constructor.

Instances

Eq FileContentHintsThumbnail Source # 
Data FileContentHintsThumbnail Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileContentHintsThumbnail -> c FileContentHintsThumbnail #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileContentHintsThumbnail #

toConstr :: FileContentHintsThumbnail -> Constr #

dataTypeOf :: FileContentHintsThumbnail -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileContentHintsThumbnail) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileContentHintsThumbnail) #

gmapT :: (forall b. Data b => b -> b) -> FileContentHintsThumbnail -> FileContentHintsThumbnail #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileContentHintsThumbnail -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileContentHintsThumbnail -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileContentHintsThumbnail -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileContentHintsThumbnail -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileContentHintsThumbnail -> m FileContentHintsThumbnail #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileContentHintsThumbnail -> m FileContentHintsThumbnail #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileContentHintsThumbnail -> m FileContentHintsThumbnail #

Show FileContentHintsThumbnail Source # 
Generic FileContentHintsThumbnail Source # 
ToJSON FileContentHintsThumbnail Source # 
FromJSON FileContentHintsThumbnail Source # 
type Rep FileContentHintsThumbnail Source # 
type Rep FileContentHintsThumbnail = D1 (MetaData "FileContentHintsThumbnail" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileContentHintsThumbnail'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_fchtImage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bytes))) (S1 (MetaSel (Just Symbol "_fchtMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

fileContentHintsThumbnail :: FileContentHintsThumbnail Source #

Creates a value of FileContentHintsThumbnail with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fchtImage :: Lens' FileContentHintsThumbnail (Maybe ByteString) Source #

The thumbnail data encoded with URL-safe Base64 (RFC 4648 section 5).

fchtMimeType :: Lens' FileContentHintsThumbnail (Maybe Text) Source #

The MIME type of the thumbnail.

Channel

data Channel Source #

An notification channel used to watch for resource changes.

See: channel smart constructor.

Instances

Eq Channel Source # 

Methods

(==) :: Channel -> Channel -> Bool #

(/=) :: Channel -> Channel -> Bool #

Data Channel Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Channel -> c Channel #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Channel #

toConstr :: Channel -> Constr #

dataTypeOf :: Channel -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Channel) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Channel) #

gmapT :: (forall b. Data b => b -> b) -> Channel -> Channel #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Channel -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Channel -> r #

gmapQ :: (forall d. Data d => d -> u) -> Channel -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Channel -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Channel -> m Channel #

Show Channel Source # 
Generic Channel Source # 

Associated Types

type Rep Channel :: * -> * #

Methods

from :: Channel -> Rep Channel x #

to :: Rep Channel x -> Channel #

ToJSON Channel Source # 
FromJSON Channel Source # 
type Rep Channel Source # 

channel :: Channel Source #

Creates a value of Channel with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cResourceURI :: Lens' Channel (Maybe Text) Source #

A version-specific identifier for the watched resource.

cResourceId :: Lens' Channel (Maybe Text) Source #

An opaque ID that identifies the resource being watched on this channel. Stable across different API versions.

cKind :: Lens' Channel Text Source #

Identifies this as a notification channel used to watch for changes to a resource. Value: the fixed string "api#channel".

cExpiration :: Lens' Channel (Maybe Int64) Source #

Date and time of notification channel expiration, expressed as a Unix timestamp, in milliseconds. Optional.

cToken :: Lens' Channel (Maybe Text) Source #

An arbitrary string delivered to the target address with each notification delivered over this channel. Optional.

cAddress :: Lens' Channel (Maybe Text) Source #

The address where notifications are delivered for this channel.

cPayload :: Lens' Channel (Maybe Bool) Source #

A Boolean value to indicate whether payload is wanted. Optional.

cParams :: Lens' Channel (Maybe ChannelParams) Source #

Additional parameters controlling delivery channel behavior. Optional.

cId :: Lens' Channel (Maybe Text) Source #

A UUID or similar unique string that identifies this channel.

cType :: Lens' Channel (Maybe Text) Source #

The type of delivery mechanism used for this channel.

FileVideoMediaMetadata

data FileVideoMediaMetadata Source #

Additional metadata about video media. This may not be available immediately upon upload.

See: fileVideoMediaMetadata smart constructor.

Instances

Eq FileVideoMediaMetadata Source # 
Data FileVideoMediaMetadata Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileVideoMediaMetadata -> c FileVideoMediaMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileVideoMediaMetadata #

toConstr :: FileVideoMediaMetadata -> Constr #

dataTypeOf :: FileVideoMediaMetadata -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileVideoMediaMetadata) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileVideoMediaMetadata) #

gmapT :: (forall b. Data b => b -> b) -> FileVideoMediaMetadata -> FileVideoMediaMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileVideoMediaMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileVideoMediaMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileVideoMediaMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileVideoMediaMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileVideoMediaMetadata -> m FileVideoMediaMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileVideoMediaMetadata -> m FileVideoMediaMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileVideoMediaMetadata -> m FileVideoMediaMetadata #

Show FileVideoMediaMetadata Source # 
Generic FileVideoMediaMetadata Source # 
ToJSON FileVideoMediaMetadata Source # 
FromJSON FileVideoMediaMetadata Source # 
type Rep FileVideoMediaMetadata Source # 
type Rep FileVideoMediaMetadata = D1 (MetaData "FileVideoMediaMetadata" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileVideoMediaMetadata'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_fvmmHeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) ((:*:) (S1 (MetaSel (Just Symbol "_fvmmWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_fvmmDurationMillis") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))

fileVideoMediaMetadata :: FileVideoMediaMetadata Source #

Creates a value of FileVideoMediaMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fvmmHeight :: Lens' FileVideoMediaMetadata (Maybe Int32) Source #

The height of the video in pixels.

fvmmWidth :: Lens' FileVideoMediaMetadata (Maybe Int32) Source #

The width of the video in pixels.

fvmmDurationMillis :: Lens' FileVideoMediaMetadata (Maybe Int64) Source #

The duration of the video in milliseconds.

FileAppProperties

data FileAppProperties Source #

A collection of arbitrary key-value pairs which are private to the requesting app. Entries with null values are cleared in update and copy requests.

See: fileAppProperties smart constructor.

Instances

Eq FileAppProperties Source # 
Data FileAppProperties Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileAppProperties -> c FileAppProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileAppProperties #

toConstr :: FileAppProperties -> Constr #

dataTypeOf :: FileAppProperties -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileAppProperties) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileAppProperties) #

gmapT :: (forall b. Data b => b -> b) -> FileAppProperties -> FileAppProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileAppProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileAppProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileAppProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileAppProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileAppProperties -> m FileAppProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileAppProperties -> m FileAppProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileAppProperties -> m FileAppProperties #

Show FileAppProperties Source # 
Generic FileAppProperties Source # 
ToJSON FileAppProperties Source # 
FromJSON FileAppProperties Source # 
type Rep FileAppProperties Source # 
type Rep FileAppProperties = D1 (MetaData "FileAppProperties" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "FileAppProperties'" PrefixI True) (S1 (MetaSel (Just Symbol "_fapAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

fileAppProperties Source #

Creates a value of FileAppProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

Change

data Change Source #

A change to a file.

See: change smart constructor.

Instances

Eq Change Source # 

Methods

(==) :: Change -> Change -> Bool #

(/=) :: Change -> Change -> Bool #

Data Change Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Change -> c Change #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Change #

toConstr :: Change -> Constr #

dataTypeOf :: Change -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Change) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Change) #

gmapT :: (forall b. Data b => b -> b) -> Change -> Change #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Change -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Change -> r #

gmapQ :: (forall d. Data d => d -> u) -> Change -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Change -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Change -> m Change #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Change -> m Change #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Change -> m Change #

Show Change Source # 
Generic Change Source # 

Associated Types

type Rep Change :: * -> * #

Methods

from :: Change -> Rep Change x #

to :: Rep Change x -> Change #

ToJSON Change Source # 
FromJSON Change Source # 
type Rep Change Source # 

change :: Change Source #

Creates a value of Change with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

chaRemoved :: Lens' Change (Maybe Bool) Source #

Whether the file has been removed from the view of the changes list, for example by deletion or lost access.

chaTime :: Lens' Change (Maybe UTCTime) Source #

The time of this change (RFC 3339 date-time).

chaKind :: Lens' Change Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#change".

chaFileId :: Lens' Change (Maybe Text) Source #

The ID of the file which has changed.

chaFile :: Lens' Change (Maybe File) Source #

The updated state of the file. Present if the file has not been removed.

AboutExportFormats

data AboutExportFormats Source #

A map of source MIME type to possible targets for all supported exports.

See: aboutExportFormats smart constructor.

Instances

Eq AboutExportFormats Source # 
Data AboutExportFormats Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AboutExportFormats -> c AboutExportFormats #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AboutExportFormats #

toConstr :: AboutExportFormats -> Constr #

dataTypeOf :: AboutExportFormats -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AboutExportFormats) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AboutExportFormats) #

gmapT :: (forall b. Data b => b -> b) -> AboutExportFormats -> AboutExportFormats #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AboutExportFormats -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AboutExportFormats -> r #

gmapQ :: (forall d. Data d => d -> u) -> AboutExportFormats -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AboutExportFormats -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AboutExportFormats -> m AboutExportFormats #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutExportFormats -> m AboutExportFormats #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutExportFormats -> m AboutExportFormats #

Show AboutExportFormats Source # 
Generic AboutExportFormats Source # 
ToJSON AboutExportFormats Source # 
FromJSON AboutExportFormats Source # 
type Rep AboutExportFormats Source # 
type Rep AboutExportFormats = D1 (MetaData "AboutExportFormats" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "AboutExportFormats'" PrefixI True) (S1 (MetaSel (Just Symbol "_aefAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text [Text]))))

aboutExportFormats Source #

Creates a value of AboutExportFormats with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

User

data User Source #

Information about a Drive user.

See: user smart constructor.

Instances

Eq User Source # 

Methods

(==) :: User -> User -> Bool #

(/=) :: User -> User -> Bool #

Data User Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> User -> c User #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c User #

toConstr :: User -> Constr #

dataTypeOf :: User -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c User) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c User) #

gmapT :: (forall b. Data b => b -> b) -> User -> User #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> User -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> User -> r #

gmapQ :: (forall d. Data d => d -> u) -> User -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> User -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> User -> m User #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> User -> m User #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> User -> m User #

Show User Source # 

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

Generic User Source # 

Associated Types

type Rep User :: * -> * #

Methods

from :: User -> Rep User x #

to :: Rep User x -> User #

ToJSON User Source # 
FromJSON User Source # 
type Rep User Source # 

user :: User Source #

Creates a value of User with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uPhotoLink :: Lens' User (Maybe Text) Source #

A link to the user's profile photo, if available.

uMe :: Lens' User (Maybe Bool) Source #

Whether this user is the requesting user.

uKind :: Lens' User Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#user".

uEmailAddress :: Lens' User (Maybe Text) Source #

The email address of the user. This may not be present in certain contexts if the user has not made their email address visible to the requester.

uDisplayName :: Lens' User (Maybe Text) Source #

A plain text displayable name for this user.

uPermissionId :: Lens' User (Maybe Text) Source #

The user's ID as visible in Permission resources.

ChangeList

data ChangeList Source #

A list of changes for a user.

See: changeList smart constructor.

Instances

Eq ChangeList Source # 
Data ChangeList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChangeList -> c ChangeList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChangeList #

toConstr :: ChangeList -> Constr #

dataTypeOf :: ChangeList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ChangeList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChangeList) #

gmapT :: (forall b. Data b => b -> b) -> ChangeList -> ChangeList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChangeList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChangeList -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChangeList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChangeList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChangeList -> m ChangeList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChangeList -> m ChangeList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChangeList -> m ChangeList #

Show ChangeList Source # 
Generic ChangeList Source # 

Associated Types

type Rep ChangeList :: * -> * #

ToJSON ChangeList Source # 
FromJSON ChangeList Source # 
type Rep ChangeList Source # 
type Rep ChangeList = D1 (MetaData "ChangeList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "ChangeList'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_clNewStartPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_clNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_clChanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Change]))) (S1 (MetaSel (Just Symbol "_clKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))))

changeList :: ChangeList Source #

Creates a value of ChangeList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

clNewStartPageToken :: Lens' ChangeList (Maybe Text) Source #

The starting page token for future changes. This will be present only if the end of the current changes list has been reached.

clNextPageToken :: Lens' ChangeList (Maybe Text) Source #

The page token for the next page of changes. This will be absent if the end of the changes list has been reached. If the token is rejected for any reason, it should be discarded, and pagination should be restarted from the first page of results.

clChanges :: Lens' ChangeList [Change] Source #

The list of changes. If nextPageToken is populated, then this list may be incomplete and an additional page of results should be fetched.

clKind :: Lens' ChangeList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#changeList".

FileContentHints

data FileContentHints Source #

Additional information about the content of the file. These fields are never populated in responses.

See: fileContentHints smart constructor.

Instances

Eq FileContentHints Source # 
Data FileContentHints Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileContentHints -> c FileContentHints #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileContentHints #

toConstr :: FileContentHints -> Constr #

dataTypeOf :: FileContentHints -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileContentHints) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileContentHints) #

gmapT :: (forall b. Data b => b -> b) -> FileContentHints -> FileContentHints #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileContentHints -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileContentHints -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileContentHints -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileContentHints -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileContentHints -> m FileContentHints #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileContentHints -> m FileContentHints #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileContentHints -> m FileContentHints #

Show FileContentHints Source # 
Generic FileContentHints Source # 
ToJSON FileContentHints Source # 
FromJSON FileContentHints Source # 
type Rep FileContentHints Source # 
type Rep FileContentHints = D1 (MetaData "FileContentHints" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileContentHints'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_fchThumbnail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileContentHintsThumbnail))) (S1 (MetaSel (Just Symbol "_fchIndexableText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

fileContentHints :: FileContentHints Source #

Creates a value of FileContentHints with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fchThumbnail :: Lens' FileContentHints (Maybe FileContentHintsThumbnail) Source #

A thumbnail for the file. This will only be used if Drive cannot generate a standard thumbnail.

fchIndexableText :: Lens' FileContentHints (Maybe Text) Source #

Text to be indexed for the file to improve fullText queries. This is limited to 128KB in length and may contain HTML elements.

ChannelParams

data ChannelParams Source #

Additional parameters controlling delivery channel behavior. Optional.

See: channelParams smart constructor.

Instances

Eq ChannelParams Source # 
Data ChannelParams Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChannelParams -> c ChannelParams #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChannelParams #

toConstr :: ChannelParams -> Constr #

dataTypeOf :: ChannelParams -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c ChannelParams) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChannelParams) #

gmapT :: (forall b. Data b => b -> b) -> ChannelParams -> ChannelParams #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChannelParams -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChannelParams -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChannelParams -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChannelParams -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChannelParams -> m ChannelParams #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChannelParams -> m ChannelParams #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChannelParams -> m ChannelParams #

Show ChannelParams Source # 
Generic ChannelParams Source # 

Associated Types

type Rep ChannelParams :: * -> * #

ToJSON ChannelParams Source # 
FromJSON ChannelParams Source # 
type Rep ChannelParams Source # 
type Rep ChannelParams = D1 (MetaData "ChannelParams" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "ChannelParams'" PrefixI True) (S1 (MetaSel (Just Symbol "_cpAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

channelParams Source #

Creates a value of ChannelParams with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cpAddtional :: Lens' ChannelParams (HashMap Text Text) Source #

Declares a new parameter by name.

FileProperties

data FileProperties Source #

A collection of arbitrary key-value pairs which are visible to all apps. Entries with null values are cleared in update and copy requests.

See: fileProperties smart constructor.

Instances

Eq FileProperties Source # 
Data FileProperties Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileProperties -> c FileProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileProperties #

toConstr :: FileProperties -> Constr #

dataTypeOf :: FileProperties -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileProperties) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileProperties) #

gmapT :: (forall b. Data b => b -> b) -> FileProperties -> FileProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileProperties -> m FileProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileProperties -> m FileProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileProperties -> m FileProperties #

Show FileProperties Source # 
Generic FileProperties Source # 

Associated Types

type Rep FileProperties :: * -> * #

ToJSON FileProperties Source # 
FromJSON FileProperties Source # 
type Rep FileProperties Source # 
type Rep FileProperties = D1 (MetaData "FileProperties" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "FileProperties'" PrefixI True) (S1 (MetaSel (Just Symbol "_fpAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text Text))))

fileProperties Source #

Creates a value of FileProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AboutMaxImportSizes

data AboutMaxImportSizes Source #

A map of maximum import sizes by MIME type, in bytes.

See: aboutMaxImportSizes smart constructor.

Instances

Eq AboutMaxImportSizes Source # 
Data AboutMaxImportSizes Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AboutMaxImportSizes -> c AboutMaxImportSizes #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AboutMaxImportSizes #

toConstr :: AboutMaxImportSizes -> Constr #

dataTypeOf :: AboutMaxImportSizes -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c AboutMaxImportSizes) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AboutMaxImportSizes) #

gmapT :: (forall b. Data b => b -> b) -> AboutMaxImportSizes -> AboutMaxImportSizes #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AboutMaxImportSizes -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AboutMaxImportSizes -> r #

gmapQ :: (forall d. Data d => d -> u) -> AboutMaxImportSizes -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AboutMaxImportSizes -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AboutMaxImportSizes -> m AboutMaxImportSizes #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutMaxImportSizes -> m AboutMaxImportSizes #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AboutMaxImportSizes -> m AboutMaxImportSizes #

Show AboutMaxImportSizes Source # 
Generic AboutMaxImportSizes Source # 
ToJSON AboutMaxImportSizes Source # 
FromJSON AboutMaxImportSizes Source # 
type Rep AboutMaxImportSizes Source # 
type Rep AboutMaxImportSizes = D1 (MetaData "AboutMaxImportSizes" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" True) (C1 (MetaCons "AboutMaxImportSizes'" PrefixI True) (S1 (MetaSel (Just Symbol "_amisAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text (Textual Int64)))))

aboutMaxImportSizes Source #

Creates a value of AboutMaxImportSizes with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

About

data About Source #

Information about the user, the user's Drive, and system capabilities.

See: about smart constructor.

Instances

Eq About Source # 

Methods

(==) :: About -> About -> Bool #

(/=) :: About -> About -> Bool #

Data About Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> About -> c About #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c About #

toConstr :: About -> Constr #

dataTypeOf :: About -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c About) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c About) #

gmapT :: (forall b. Data b => b -> b) -> About -> About #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> About -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> About -> r #

gmapQ :: (forall d. Data d => d -> u) -> About -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> About -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> About -> m About #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> About -> m About #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> About -> m About #

Show About Source # 

Methods

showsPrec :: Int -> About -> ShowS #

show :: About -> String #

showList :: [About] -> ShowS #

Generic About Source # 

Associated Types

type Rep About :: * -> * #

Methods

from :: About -> Rep About x #

to :: Rep About x -> About #

ToJSON About Source # 
FromJSON About Source # 
type Rep About Source # 

about :: About Source #

Creates a value of About with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aExportFormats :: Lens' About (Maybe AboutExportFormats) Source #

A map of source MIME type to possible targets for all supported exports.

aMaxImportSizes :: Lens' About (Maybe AboutMaxImportSizes) Source #

A map of maximum import sizes by MIME type, in bytes.

aImportFormats :: Lens' About (Maybe AboutImportFormats) Source #

A map of source MIME type to possible targets for all supported imports.

aKind :: Lens' About Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#about".

aAppInstalled :: Lens' About (Maybe Bool) Source #

Whether the user has installed the requesting app.

aUser :: Lens' About (Maybe User) Source #

The authenticated user.

aStorageQuota :: Lens' About (Maybe AboutStorageQuota) Source #

The user's storage quota limits and usage. All fields are measured in bytes.

aMaxUploadSize :: Lens' About (Maybe Int64) Source #

The maximum upload size in bytes.

aFolderColorPalette :: Lens' About [Text] Source #

The currently supported folder colors as RGB hex strings.

FileImageMediaMetadataLocation

data FileImageMediaMetadataLocation Source #

Geographic location information stored in the image.

See: fileImageMediaMetadataLocation smart constructor.

Instances

Eq FileImageMediaMetadataLocation Source # 
Data FileImageMediaMetadataLocation Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileImageMediaMetadataLocation -> c FileImageMediaMetadataLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileImageMediaMetadataLocation #

toConstr :: FileImageMediaMetadataLocation -> Constr #

dataTypeOf :: FileImageMediaMetadataLocation -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileImageMediaMetadataLocation) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileImageMediaMetadataLocation) #

gmapT :: (forall b. Data b => b -> b) -> FileImageMediaMetadataLocation -> FileImageMediaMetadataLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileImageMediaMetadataLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileImageMediaMetadataLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileImageMediaMetadataLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileImageMediaMetadataLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileImageMediaMetadataLocation -> m FileImageMediaMetadataLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileImageMediaMetadataLocation -> m FileImageMediaMetadataLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileImageMediaMetadataLocation -> m FileImageMediaMetadataLocation #

Show FileImageMediaMetadataLocation Source # 
Generic FileImageMediaMetadataLocation Source # 
ToJSON FileImageMediaMetadataLocation Source # 
FromJSON FileImageMediaMetadataLocation Source # 
type Rep FileImageMediaMetadataLocation Source # 
type Rep FileImageMediaMetadataLocation = D1 (MetaData "FileImageMediaMetadataLocation" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileImageMediaMetadataLocation'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_fimmlLatitude") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmlAltitude") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) (S1 (MetaSel (Just Symbol "_fimmlLongitude") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))))))

fileImageMediaMetadataLocation :: FileImageMediaMetadataLocation Source #

Creates a value of FileImageMediaMetadataLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fimmlLatitude :: Lens' FileImageMediaMetadataLocation (Maybe Double) Source #

The latitude stored in the image.

fimmlAltitude :: Lens' FileImageMediaMetadataLocation (Maybe Double) Source #

The altitude stored in the image.

fimmlLongitude :: Lens' FileImageMediaMetadataLocation (Maybe Double) Source #

The longitude stored in the image.

StartPageToken

data StartPageToken Source #

Instances

Eq StartPageToken Source # 
Data StartPageToken Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> StartPageToken -> c StartPageToken #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c StartPageToken #

toConstr :: StartPageToken -> Constr #

dataTypeOf :: StartPageToken -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c StartPageToken) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c StartPageToken) #

gmapT :: (forall b. Data b => b -> b) -> StartPageToken -> StartPageToken #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> StartPageToken -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> StartPageToken -> r #

gmapQ :: (forall d. Data d => d -> u) -> StartPageToken -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> StartPageToken -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> StartPageToken -> m StartPageToken #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> StartPageToken -> m StartPageToken #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> StartPageToken -> m StartPageToken #

Show StartPageToken Source # 
Generic StartPageToken Source # 

Associated Types

type Rep StartPageToken :: * -> * #

ToJSON StartPageToken Source # 
FromJSON StartPageToken Source # 
type Rep StartPageToken Source # 
type Rep StartPageToken = D1 (MetaData "StartPageToken" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "StartPageToken'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sptKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_sptStartPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

startPageToken :: StartPageToken Source #

Creates a value of StartPageToken with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sptKind :: Lens' StartPageToken Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#startPageToken".

sptStartPageToken :: Lens' StartPageToken (Maybe Text) Source #

The starting page token for listing changes.

FileImageMediaMetadata

data FileImageMediaMetadata Source #

Additional metadata about image media, if available.

See: fileImageMediaMetadata smart constructor.

Instances

Eq FileImageMediaMetadata Source # 
Data FileImageMediaMetadata Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FileImageMediaMetadata -> c FileImageMediaMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FileImageMediaMetadata #

toConstr :: FileImageMediaMetadata -> Constr #

dataTypeOf :: FileImageMediaMetadata -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c FileImageMediaMetadata) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FileImageMediaMetadata) #

gmapT :: (forall b. Data b => b -> b) -> FileImageMediaMetadata -> FileImageMediaMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FileImageMediaMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FileImageMediaMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> FileImageMediaMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FileImageMediaMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FileImageMediaMetadata -> m FileImageMediaMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FileImageMediaMetadata -> m FileImageMediaMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FileImageMediaMetadata -> m FileImageMediaMetadata #

Show FileImageMediaMetadata Source # 
Generic FileImageMediaMetadata Source # 
ToJSON FileImageMediaMetadata Source # 
FromJSON FileImageMediaMetadata Source # 
type Rep FileImageMediaMetadata Source # 
type Rep FileImageMediaMetadata = D1 (MetaData "FileImageMediaMetadata" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "FileImageMediaMetadata'" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fimmRotation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_fimmHeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmSubjectDistance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmMaxApertureValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) (S1 (MetaSel (Just Symbol "_fimmIsoSpeed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fimmTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fimmLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileImageMediaMetadataLocation)))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmAperture") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmFocalLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) (S1 (MetaSel (Just Symbol "_fimmCameraMake") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fimmWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_fimmExposureTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmCameraModel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmWhiteBalance") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fimmLens") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fimmFlashUsed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmExposureBias") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) (S1 (MetaSel (Just Symbol "_fimmMeteringMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmExposureMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fimmSensor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fimmColorSpace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))))

fimmRotation :: Lens' FileImageMediaMetadata (Maybe Int32) Source #

The rotation in clockwise degrees from the image's original orientation.

fimmHeight :: Lens' FileImageMediaMetadata (Maybe Int32) Source #

The height of the image in pixels.

fimmSubjectDistance :: Lens' FileImageMediaMetadata (Maybe Int32) Source #

The distance to the subject of the photo, in meters.

fimmMaxApertureValue :: Lens' FileImageMediaMetadata (Maybe Double) Source #

The smallest f-number of the lens at the focal length used to create the photo (APEX value).

fimmIsoSpeed :: Lens' FileImageMediaMetadata (Maybe Int32) Source #

The ISO speed used to create the photo.

fimmTime :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The date and time the photo was taken (EXIF DateTime).

fimmLocation :: Lens' FileImageMediaMetadata (Maybe FileImageMediaMetadataLocation) Source #

Geographic location information stored in the image.

fimmAperture :: Lens' FileImageMediaMetadata (Maybe Double) Source #

The aperture used to create the photo (f-number).

fimmFocalLength :: Lens' FileImageMediaMetadata (Maybe Double) Source #

The focal length used to create the photo, in millimeters.

fimmCameraMake :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The make of the camera used to create the photo.

fimmWidth :: Lens' FileImageMediaMetadata (Maybe Int32) Source #

The width of the image in pixels.

fimmExposureTime :: Lens' FileImageMediaMetadata (Maybe Double) Source #

The length of the exposure, in seconds.

fimmCameraModel :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The model of the camera used to create the photo.

fimmWhiteBalance :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The white balance mode used to create the photo.

fimmLens :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The lens used to create the photo.

fimmFlashUsed :: Lens' FileImageMediaMetadata (Maybe Bool) Source #

Whether a flash was used to create the photo.

fimmExposureBias :: Lens' FileImageMediaMetadata (Maybe Double) Source #

The exposure bias of the photo (APEX value).

fimmMeteringMode :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The metering mode used to create the photo.

fimmExposureMode :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The exposure mode used to create the photo.

fimmSensor :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The type of sensor used to create the photo.

fimmColorSpace :: Lens' FileImageMediaMetadata (Maybe Text) Source #

The color space of the photo.

Comment

data Comment Source #

A comment on a file.

See: comment smart constructor.

Instances

Eq Comment Source # 

Methods

(==) :: Comment -> Comment -> Bool #

(/=) :: Comment -> Comment -> Bool #

Data Comment Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Comment -> c Comment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Comment #

toConstr :: Comment -> Constr #

dataTypeOf :: Comment -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Comment) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Comment) #

gmapT :: (forall b. Data b => b -> b) -> Comment -> Comment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Comment -> r #

gmapQ :: (forall d. Data d => d -> u) -> Comment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Comment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Comment -> m Comment #

Show Comment Source # 
Generic Comment Source # 

Associated Types

type Rep Comment :: * -> * #

Methods

from :: Comment -> Rep Comment x #

to :: Rep Comment x -> Comment #

ToJSON Comment Source # 
FromJSON Comment Source # 
type Rep Comment Source # 
type Rep Comment = D1 (MetaData "Comment" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "Comment'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_comHTMLContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_comModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) (S1 (MetaSel (Just Symbol "_comCreatedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))) ((:*:) (S1 (MetaSel (Just Symbol "_comKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) ((:*:) (S1 (MetaSel (Just Symbol "_comResolved") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_comQuotedFileContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CommentQuotedFileContent)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_comAnchor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_comContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_comReplies") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Reply]))))) ((:*:) (S1 (MetaSel (Just Symbol "_comAuthor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe User))) ((:*:) (S1 (MetaSel (Just Symbol "_comId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_comDeleted") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))))

comment :: Comment Source #

Creates a value of Comment with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

comHTMLContent :: Lens' Comment (Maybe Text) Source #

The content of the comment with HTML formatting.

comModifiedTime :: Lens' Comment (Maybe UTCTime) Source #

The last time the comment or any of its replies was modified (RFC 3339 date-time).

comCreatedTime :: Lens' Comment (Maybe UTCTime) Source #

The time at which the comment was created (RFC 3339 date-time).

comKind :: Lens' Comment Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#comment".

comResolved :: Lens' Comment (Maybe Bool) Source #

Whether the comment has been resolved by one of its replies.

comQuotedFileContent :: Lens' Comment (Maybe CommentQuotedFileContent) Source #

The file content to which the comment refers, typically within the anchor region. For a text file, for example, this would be the text at the location of the comment.

comAnchor :: Lens' Comment (Maybe Text) Source #

A region of the document represented as a JSON string. See anchor documentation for details on how to define and interpret anchor properties.

comContent :: Lens' Comment (Maybe Text) Source #

The plain text content of the comment. This field is used for setting the content, while htmlContent should be displayed.

comReplies :: Lens' Comment [Reply] Source #

The full list of replies to the comment in chronological order.

comAuthor :: Lens' Comment (Maybe User) Source #

The user who created the comment.

comId :: Lens' Comment (Maybe Text) Source #

The ID of the comment.

comDeleted :: Lens' Comment (Maybe Bool) Source #

Whether the comment has been deleted. A deleted comment has no content.

Revision

data Revision Source #

The metadata for a revision to a file.

See: revision smart constructor.

Instances

Eq Revision Source # 
Data Revision Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Revision -> c Revision #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Revision #

toConstr :: Revision -> Constr #

dataTypeOf :: Revision -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Revision) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Revision) #

gmapT :: (forall b. Data b => b -> b) -> Revision -> Revision #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Revision -> r #

gmapQ :: (forall d. Data d => d -> u) -> Revision -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Revision -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Revision -> m Revision #

Show Revision Source # 
Generic Revision Source # 

Associated Types

type Rep Revision :: * -> * #

Methods

from :: Revision -> Rep Revision x #

to :: Rep Revision x -> Revision #

ToJSON Revision Source # 
FromJSON Revision Source # 
type Rep Revision Source # 
type Rep Revision = D1 (MetaData "Revision" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "Revision'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_revModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) ((:*:) (S1 (MetaSel (Just Symbol "_revSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) (S1 (MetaSel (Just Symbol "_revOriginalFilename") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_revKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) ((:*:) (S1 (MetaSel (Just Symbol "_revPublished") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_revLastModifyingUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe User)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_revPublishAuto") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_revMD5Checksum") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_revKeepForever") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) ((:*:) (S1 (MetaSel (Just Symbol "_revMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_revPublishedOutsideDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_revId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

revision :: Revision Source #

Creates a value of Revision with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

revModifiedTime :: Lens' Revision (Maybe UTCTime) Source #

The last time the revision was modified (RFC 3339 date-time).

revSize :: Lens' Revision (Maybe Int64) Source #

The size of the revision's content in bytes. This is only applicable to files with binary content in Drive.

revOriginalFilename :: Lens' Revision (Maybe Text) Source #

The original filename used to create this revision. This is only applicable to files with binary content in Drive.

revKind :: Lens' Revision Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#revision".

revPublished :: Lens' Revision (Maybe Bool) Source #

Whether this revision is published. This is only applicable to Google Docs.

revLastModifyingUser :: Lens' Revision (Maybe User) Source #

The last user to modify this revision.

revPublishAuto :: Lens' Revision (Maybe Bool) Source #

Whether subsequent revisions will be automatically republished. This is only applicable to Google Docs.

revMD5Checksum :: Lens' Revision (Maybe Text) Source #

The MD5 checksum of the revision's content. This is only applicable to files with binary content in Drive.

revKeepForever :: Lens' Revision (Maybe Bool) Source #

Whether to keep this revision forever, even if it is no longer the head revision. If not set, the revision will be automatically purged 30 days after newer content is uploaded. This can be set on a maximum of 200 revisions for a file. This field is only applicable to files with binary content in Drive.

revMimeType :: Lens' Revision (Maybe Text) Source #

The MIME type of the revision.

revPublishedOutsideDomain :: Lens' Revision (Maybe Bool) Source #

Whether this revision is published outside the domain. This is only applicable to Google Docs.

revId :: Lens' Revision (Maybe Text) Source #

The ID of the revision.

Permission

data Permission Source #

A permission for a file. A permission grants a user, group, domain or the world access to a file or a folder hierarchy.

See: permission smart constructor.

Instances

Eq Permission Source # 
Data Permission Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Permission -> c Permission #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Permission #

toConstr :: Permission -> Constr #

dataTypeOf :: Permission -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c Permission) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Permission) #

gmapT :: (forall b. Data b => b -> b) -> Permission -> Permission #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Permission -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Permission -> r #

gmapQ :: (forall d. Data d => d -> u) -> Permission -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Permission -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Permission -> m Permission #

Show Permission Source # 
Generic Permission Source # 

Associated Types

type Rep Permission :: * -> * #

ToJSON Permission Source # 
FromJSON Permission Source # 
type Rep Permission Source # 

permission :: Permission Source #

Creates a value of Permission with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pPhotoLink :: Lens' Permission (Maybe Text) Source #

A link to the user's profile photo, if available.

pKind :: Lens' Permission Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#permission".

pDomain :: Lens' Permission (Maybe Text) Source #

The domain to which this permission refers.

pRole :: Lens' Permission (Maybe Text) Source #

The role granted by this permission. Valid values are: - owner - writer - commenter - reader

pEmailAddress :: Lens' Permission (Maybe Text) Source #

The email address of the user or group to which this permission refers.

pAllowFileDiscovery :: Lens' Permission (Maybe Bool) Source #

Whether the permission allows the file to be discovered through search. This is only applicable for permissions of type domain or anyone.

pDisplayName :: Lens' Permission (Maybe Text) Source #

A displayable name for users, groups or domains.

pId :: Lens' Permission (Maybe Text) Source #

The ID of this permission. This is a unique identifier for the grantee, and is published in User resources as permissionId.

pType :: Lens' Permission (Maybe Text) Source #

The type of the grantee. Valid values are: - user - group - domain - anyone

pExpirationTime :: Lens' Permission (Maybe UTCTime) Source #

The time at which this permission will expire (RFC 3339 date-time).

File

data File Source #

The metadata for a file.

See: file smart constructor.

Instances

Eq File Source # 

Methods

(==) :: File -> File -> Bool #

(/=) :: File -> File -> Bool #

Data File Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> File -> c File #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c File #

toConstr :: File -> Constr #

dataTypeOf :: File -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c File) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c File) #

gmapT :: (forall b. Data b => b -> b) -> File -> File #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> File -> r #

gmapQ :: (forall d. Data d => d -> u) -> File -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> File -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> File -> m File #

Show File Source # 

Methods

showsPrec :: Int -> File -> ShowS #

show :: File -> String #

showList :: [File] -> ShowS #

Generic File Source # 

Associated Types

type Rep File :: * -> * #

Methods

from :: File -> Rep File x #

to :: Rep File x -> File #

ToJSON File Source # 
FromJSON File Source # 
type Rep File Source # 
type Rep File = D1 (MetaData "File" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "File'" PrefixI True) ((:*:) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fOwnedByMe") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fThumbnailLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_fFullFileExtension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fModifiedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) (S1 (MetaSel (Just Symbol "_fModifiedByMeTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime')))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fFileExtension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fViewedByMe") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fOwners") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [User]))))) ((:*:) (S1 (MetaSel (Just Symbol "_fViewedByMeTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) ((:*:) (S1 (MetaSel (Just Symbol "_fModifiedByMe") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fTrashed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fWebViewLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fCreatedTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))))) ((:*:) (S1 (MetaSel (Just Symbol "_fOriginalFilename") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_fLastModifyingUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe User)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fIconLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fHasThumbnail") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fThumbnailVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) ((:*:) (S1 (MetaSel (Just Symbol "_fImageMediaMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileImageMediaMetadata))) ((:*:) (S1 (MetaSel (Just Symbol "_fExplicitlyTrashed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fShared") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))) ((:*:) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fMD5Checksum") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fFolderColorRgb") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_fIsAppAuthorized") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fParents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fStarred") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fSpaces") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_fVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))))) ((:*:) (S1 (MetaSel (Just Symbol "_fWritersCanShare") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_fId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fPermissions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Permission]))))))) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fQuotaBytesUsed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64)))) ((:*:) (S1 (MetaSel (Just Symbol "_fAppProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileAppProperties))) (S1 (MetaSel (Just Symbol "_fVideoMediaMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileVideoMediaMetadata))))) ((:*:) (S1 (MetaSel (Just Symbol "_fSharedWithMeTime") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTime'))) ((:*:) (S1 (MetaSel (Just Symbol "_fHeadRevisionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_fCapabilities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileCapabilities)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_fDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fViewersCanCopyContent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_fSharingUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe User))))) ((:*:) (S1 (MetaSel (Just Symbol "_fWebContentLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_fContentHints") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileContentHints))) (S1 (MetaSel (Just Symbol "_fProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FileProperties))))))))))

fOwnedByMe :: Lens' File (Maybe Bool) Source #

Whether the user owns the file.

fThumbnailLink :: Lens' File (Maybe Text) Source #

A short-lived link to the file's thumbnail, if available. Typically lasts on the order of hours. Only populated when the requesting app can access the file's content.

fFullFileExtension :: Lens' File (Maybe Text) Source #

The full file extension extracted from the name field. May contain multiple concatenated extensions, such as "tar.gz". This is only available for files with binary content in Drive. This is automatically updated when the name field changes, however it is not cleared if the new name does not contain a valid extension.

fModifiedTime :: Lens' File (Maybe UTCTime) Source #

The last time the file was modified by anyone (RFC 3339 date-time). Note that setting modifiedTime will also update modifiedByMeTime for the user.

fModifiedByMeTime :: Lens' File (Maybe UTCTime) Source #

The last time the file was modified by the user (RFC 3339 date-time).

fFileExtension :: Lens' File (Maybe Text) Source #

The final component of fullFileExtension. This is only available for files with binary content in Drive.

fViewedByMe :: Lens' File (Maybe Bool) Source #

Whether the file has been viewed by this user.

fOwners :: Lens' File [User] Source #

The owners of the file. Currently, only certain legacy files may have more than one owner.

fViewedByMeTime :: Lens' File (Maybe UTCTime) Source #

The last time the file was viewed by the user (RFC 3339 date-time).

fModifiedByMe :: Lens' File (Maybe Bool) Source #

Whether the file has been modified by this user.

fSize :: Lens' File (Maybe Int64) Source #

The size of the file's content in bytes. This is only applicable to files with binary content in Drive.

fTrashed :: Lens' File (Maybe Bool) Source #

Whether the file has been trashed, either explicitly or from a trashed parent folder. Only the owner may trash a file, and other users cannot see files in the owner's trash.

fWebViewLink :: Lens' File (Maybe Text) Source #

A link for opening the file in a relevant Google editor or viewer in a browser.

fCreatedTime :: Lens' File (Maybe UTCTime) Source #

The time at which the file was created (RFC 3339 date-time).

fOriginalFilename :: Lens' File (Maybe Text) Source #

The original filename of the uploaded content if available, or else the original value of the name field. This is only available for files with binary content in Drive.

fKind :: Lens' File Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#file".

fLastModifyingUser :: Lens' File (Maybe User) Source #

The last user to modify the file.

fIconLink :: Lens' File (Maybe Text) Source #

A static, unauthenticated link to the file's icon.

fHasThumbnail :: Lens' File (Maybe Bool) Source #

Whether this file has a thumbnail.

fThumbnailVersion :: Lens' File (Maybe Int64) Source #

The thumbnail version for use in thumbnail cache invalidation.

fImageMediaMetadata :: Lens' File (Maybe FileImageMediaMetadata) Source #

Additional metadata about image media, if available.

fExplicitlyTrashed :: Lens' File (Maybe Bool) Source #

Whether the file has been explicitly trashed, as opposed to recursively trashed from a parent folder.

fShared :: Lens' File (Maybe Bool) Source #

Whether the file has been shared.

fMD5Checksum :: Lens' File (Maybe Text) Source #

The MD5 checksum for the content of the file. This is only applicable to files with binary content in Drive.

fFolderColorRgb :: Lens' File (Maybe Text) Source #

The color for a folder as an RGB hex string. The supported colors are published in the folderColorPalette field of the About resource. If an unsupported color is specified, the closest color in the palette will be used instead.

fMimeType :: Lens' File (Maybe Text) Source #

The MIME type of the file. Drive will attempt to automatically detect an appropriate value from uploaded content if no value is provided. The value cannot be changed unless a new revision is uploaded. If a file is created with a Google Doc MIME type, the uploaded content will be imported if possible. The supported import formats are published in the About resource.

fIsAppAuthorized :: Lens' File (Maybe Bool) Source #

Whether the file was created or opened by the requesting app.

fName :: Lens' File (Maybe Text) Source #

The name of the file. This is not necessarily unique within a folder.

fParents :: Lens' File [Text] Source #

The IDs of the parent folders which contain the file. If not specified as part of a create request, the file will be placed directly in the My Drive folder. Update requests must use the addParents and removeParents parameters to modify the values.

fStarred :: Lens' File (Maybe Bool) Source #

Whether the user has starred the file.

fSpaces :: Lens' File [Text] Source #

The list of spaces which contain the file. The currently supported values are 'drive', 'appDataFolder' and 'photos'.

fVersion :: Lens' File (Maybe Int64) Source #

A monotonically increasing version number for the file. This reflects every change made to the file on the server, even those not visible to the user.

fWritersCanShare :: Lens' File (Maybe Bool) Source #

Whether users with only writer permission can modify the file's permissions.

fId :: Lens' File (Maybe Text) Source #

The ID of the file.

fPermissions :: Lens' File [Permission] Source #

The full list of permissions for the file. This is only available if the requesting user can share the file.

fQuotaBytesUsed :: Lens' File (Maybe Int64) Source #

The number of storage quota bytes used by the file. This includes the head revision as well as previous revisions with keepForever enabled.

fAppProperties :: Lens' File (Maybe FileAppProperties) Source #

A collection of arbitrary key-value pairs which are private to the requesting app. Entries with null values are cleared in update and copy requests.

fVideoMediaMetadata :: Lens' File (Maybe FileVideoMediaMetadata) Source #

Additional metadata about video media. This may not be available immediately upon upload.

fSharedWithMeTime :: Lens' File (Maybe UTCTime) Source #

The time at which the file was shared with the user, if applicable (RFC 3339 date-time).

fHeadRevisionId :: Lens' File (Maybe Text) Source #

The ID of the file's head revision. This is currently only available for files with binary content in Drive.

fCapabilities :: Lens' File (Maybe FileCapabilities) Source #

Capabilities the current user has on the file.

fDescription :: Lens' File (Maybe Text) Source #

A short description of the file.

fViewersCanCopyContent :: Lens' File (Maybe Bool) Source #

Whether users with only reader or commenter permission can copy the file's content. This affects copy, download, and print operations.

fSharingUser :: Lens' File (Maybe User) Source #

The user who shared the file with the requesting user, if applicable.

fWebContentLink :: Lens' File (Maybe Text) Source #

A link for downloading the content of the file in a browser. This is only available for files with binary content in Drive.

fContentHints :: Lens' File (Maybe FileContentHints) Source #

Additional information about the content of the file. These fields are never populated in responses.

fProperties :: Lens' File (Maybe FileProperties) Source #

A collection of arbitrary key-value pairs which are visible to all apps. Entries with null values are cleared in update and copy requests.

GeneratedIds

data GeneratedIds Source #

A list of generated file IDs which can be provided in create requests.

See: generatedIds smart constructor.

Instances

Eq GeneratedIds Source # 
Data GeneratedIds Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GeneratedIds -> c GeneratedIds #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GeneratedIds #

toConstr :: GeneratedIds -> Constr #

dataTypeOf :: GeneratedIds -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c GeneratedIds) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GeneratedIds) #

gmapT :: (forall b. Data b => b -> b) -> GeneratedIds -> GeneratedIds #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GeneratedIds -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GeneratedIds -> r #

gmapQ :: (forall d. Data d => d -> u) -> GeneratedIds -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GeneratedIds -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GeneratedIds -> m GeneratedIds #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GeneratedIds -> m GeneratedIds #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GeneratedIds -> m GeneratedIds #

Show GeneratedIds Source # 
Generic GeneratedIds Source # 

Associated Types

type Rep GeneratedIds :: * -> * #

ToJSON GeneratedIds Source # 
FromJSON GeneratedIds Source # 
type Rep GeneratedIds Source # 
type Rep GeneratedIds = D1 (MetaData "GeneratedIds" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "GeneratedIds'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_giSpace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_giKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_giIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

generatedIds :: GeneratedIds Source #

Creates a value of GeneratedIds with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

giSpace :: Lens' GeneratedIds (Maybe Text) Source #

The type of file that can be created with these IDs.

giKind :: Lens' GeneratedIds Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#generatedIds".

giIds :: Lens' GeneratedIds [Text] Source #

The IDs generated for the requesting user in the specified space.

CommentList

data CommentList Source #

A list of comments on a file.

See: commentList smart constructor.

Instances

Eq CommentList Source # 
Data CommentList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CommentList -> c CommentList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CommentList #

toConstr :: CommentList -> Constr #

dataTypeOf :: CommentList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c CommentList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CommentList) #

gmapT :: (forall b. Data b => b -> b) -> CommentList -> CommentList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CommentList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CommentList -> r #

gmapQ :: (forall d. Data d => d -> u) -> CommentList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CommentList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CommentList -> m CommentList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CommentList -> m CommentList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CommentList -> m CommentList #

Show CommentList Source # 
Generic CommentList Source # 

Associated Types

type Rep CommentList :: * -> * #

ToJSON CommentList Source # 
FromJSON CommentList Source # 
type Rep CommentList Source # 
type Rep CommentList = D1 (MetaData "CommentList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "CommentList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_cllNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_cllKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_cllComments") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Comment]))))))

commentList :: CommentList Source #

Creates a value of CommentList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cllNextPageToken :: Lens' CommentList (Maybe Text) Source #

The page token for the next page of comments. This will be absent if the end of the comments list has been reached. If the token is rejected for any reason, it should be discarded, and pagination should be restarted from the first page of results.

cllKind :: Lens' CommentList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#commentList".

cllComments :: Lens' CommentList [Comment] Source #

The list of comments. If nextPageToken is populated, then this list may be incomplete and an additional page of results should be fetched.

RevisionList

data RevisionList Source #

A list of revisions of a file.

See: revisionList smart constructor.

Instances

Eq RevisionList Source # 
Data RevisionList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RevisionList -> c RevisionList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RevisionList #

toConstr :: RevisionList -> Constr #

dataTypeOf :: RevisionList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c RevisionList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RevisionList) #

gmapT :: (forall b. Data b => b -> b) -> RevisionList -> RevisionList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RevisionList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RevisionList -> r #

gmapQ :: (forall d. Data d => d -> u) -> RevisionList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RevisionList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RevisionList -> m RevisionList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RevisionList -> m RevisionList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RevisionList -> m RevisionList #

Show RevisionList Source # 
Generic RevisionList Source # 

Associated Types

type Rep RevisionList :: * -> * #

ToJSON RevisionList Source # 
FromJSON RevisionList Source # 
type Rep RevisionList Source # 
type Rep RevisionList = D1 (MetaData "RevisionList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "RevisionList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_rllNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_rllKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_rllRevisions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Revision]))))))

revisionList :: RevisionList Source #

Creates a value of RevisionList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rllNextPageToken :: Lens' RevisionList (Maybe Text) Source #

The page token for the next page of revisions. This will be absent if the end of the revisions list has been reached. If the token is rejected for any reason, it should be discarded, and pagination should be restarted from the first page of results.

rllKind :: Lens' RevisionList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#revisionList".

rllRevisions :: Lens' RevisionList [Revision] Source #

The list of revisions. If nextPageToken is populated, then this list may be incomplete and an additional page of results should be fetched.

PermissionList

data PermissionList Source #

A list of permissions for a file.

See: permissionList smart constructor.

Instances

Eq PermissionList Source # 
Data PermissionList Source # 

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PermissionList -> c PermissionList #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PermissionList #

toConstr :: PermissionList -> Constr #

dataTypeOf :: PermissionList -> DataType #

dataCast1 :: Typeable (* -> *) t => (forall d. Data d => c (t d)) -> Maybe (c PermissionList) #

dataCast2 :: Typeable (* -> * -> *) t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PermissionList) #

gmapT :: (forall b. Data b => b -> b) -> PermissionList -> PermissionList #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PermissionList -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PermissionList -> r #

gmapQ :: (forall d. Data d => d -> u) -> PermissionList -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PermissionList -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PermissionList -> m PermissionList #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PermissionList -> m PermissionList #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PermissionList -> m PermissionList #

Show PermissionList Source # 
Generic PermissionList Source # 

Associated Types

type Rep PermissionList :: * -> * #

ToJSON PermissionList Source # 
FromJSON PermissionList Source # 
type Rep PermissionList Source # 
type Rep PermissionList = D1 (MetaData "PermissionList" "Network.Google.Drive.Types.Product" "gogol-drive-0.3.0-HPclvxcWpgG8piXpdkWWOb" False) (C1 (MetaCons "PermissionList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_plKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_plPermissions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Permission])))))

permissionList :: PermissionList Source #

Creates a value of PermissionList with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

plKind :: Lens' PermissionList Text Source #

Identifies what kind of resource this is. Value: the fixed string "drive#permissionList".

plPermissions :: Lens' PermissionList [Permission] Source #

The list of permissions.