gogol-apps-activity-0.4.0: Google Drive Activity 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.AppsActivity

Contents

Description

Provides a historical view of activity.

See: Drive Activity API Reference

Synopsis

Service Configuration

appsActivityService :: ServiceConfig Source #

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

OAuth Scopes

activityScope :: Proxy '["https://www.googleapis.com/auth/activity"] Source #

View the activity history of your Google apps

API Declaration

type AppsActivityAPI = ActivitiesListResource Source #

Represents the entirety of the methods and resources available for the Drive Activity API service.

Resources

appsactivity.activities.list

Types

Parent

data Parent Source #

Contains information about a parent object. For example, a folder in Drive is a parent for all files within it.

See: parent smart constructor.

Instances
Eq Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Parent -> Constr #

dataTypeOf :: Parent -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Parent :: Type -> Type #

Methods

from :: Parent -> Rep Parent x #

to :: Rep Parent x -> Parent #

ToJSON Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Parent Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Parent = D1 (MetaData "Parent" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "Parent'" PrefixI True) (S1 (MetaSel (Just "_pIsRoot") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_pId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

parent :: Parent Source #

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

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

pIsRoot :: Lens' Parent (Maybe Bool) Source #

Whether this is the root folder.

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

The parent's ID.

pTitle :: Lens' Parent (Maybe Text) Source #

The parent's title.

Photo

data Photo Source #

Photo information for a user.

See: photo smart constructor.

Instances
Eq Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Photo -> Constr #

dataTypeOf :: Photo -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

showsPrec :: Int -> Photo -> ShowS #

show :: Photo -> String #

showList :: [Photo] -> ShowS #

Generic Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Photo :: Type -> Type #

Methods

from :: Photo -> Rep Photo x #

to :: Rep Photo x -> Photo #

ToJSON Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Photo Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Photo = D1 (MetaData "Photo" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" True) (C1 (MetaCons "Photo'" PrefixI True) (S1 (MetaSel (Just "_pURL") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

photo :: Photo Source #

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

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

pURL :: Lens' Photo (Maybe Text) Source #

The URL of the photo.

EventPrimaryEventType

data EventPrimaryEventType Source #

The main type of event that occurred.

Constructors

EPETComment
comment
EPETCreate
create
EPETEdit
edit
EPETEmptyTrash
emptyTrash
EPETMove
move
EPETPermissionChange
permissionChange
EPETRename
rename
EPETTrash
trash
EPETUnknown
unknown
EPETUntrash
untrash
EPETUpload
upload
Instances
Enum EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Eq EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Data EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Methods

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

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

toConstr :: EventPrimaryEventType -> Constr #

dataTypeOf :: EventPrimaryEventType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Read EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Show EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Generic EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Associated Types

type Rep EventPrimaryEventType :: Type -> Type #

Hashable EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToJSON EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromJSON EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromHttpApiData EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToHttpApiData EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep EventPrimaryEventType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep EventPrimaryEventType = D1 (MetaData "EventPrimaryEventType" "Network.Google.AppsActivity.Types.Sum" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (((C1 (MetaCons "EPETComment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EPETCreate" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "EPETEdit" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EPETEmptyTrash" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EPETMove" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "EPETPermissionChange" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EPETRename" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EPETTrash" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "EPETUnknown" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EPETUntrash" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EPETUpload" PrefixI False) (U1 :: Type -> Type)))))

Event

data Event Source #

Represents the changes associated with an action taken by a user.

See: event smart constructor.

Instances
Eq Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Event -> Constr #

dataTypeOf :: Event -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

showsPrec :: Int -> Event -> ShowS #

show :: Event -> String #

showList :: [Event] -> ShowS #

Generic Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Event :: Type -> Type #

Methods

from :: Event -> Rep Event x #

to :: Rep Event x -> Event #

ToJSON Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Event Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

event :: Event Source #

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

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

ePrimaryEventType :: Lens' Event (Maybe EventPrimaryEventType) Source #

The main type of event that occurred.

eUser :: Lens' Event (Maybe User) Source #

Represents the user responsible for the event.

eEventTimeMillis :: Lens' Event (Maybe Word64) Source #

The time at which the event occurred formatted as Unix time in milliseconds.

eRename :: Lens' Event (Maybe Rename) Source #

Extra information for rename type events, such as the old and new names.

eFromUserDeletion :: Lens' Event (Maybe Bool) Source #

Whether this event is caused by a user being deleted.

eAdditionalEventTypes :: Lens' Event [EventAdditionalEventTypesItem] Source #

Additional event types. Some events may have multiple types when multiple actions are part of a single event. For example, creating a document, renaming it, and sharing it may be part of a single file-creation event.

ePermissionChanges :: Lens' Event [PermissionChange] Source #

Extra information for permissionChange type events, such as the user or group the new permission applies to.

eTarget :: Lens' Event (Maybe Target) Source #

Information specific to the Target object modified by the event.

eMove :: Lens' Event (Maybe Move) Source #

Extra information for move type events, such as changes in an object's parents.

PermissionRole

data PermissionRole Source #

Indicates the Google Drive permissions role. The role determines a user's ability to read, write, or comment on the file.

Constructors

Commenter
commenter
Owner
owner
PublishedReader
publishedReader
Reader
reader
Writer
writer
Instances
Enum PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Eq PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Data PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Methods

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

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

toConstr :: PermissionRole -> Constr #

dataTypeOf :: PermissionRole -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Read PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Show PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Generic PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Associated Types

type Rep PermissionRole :: Type -> Type #

Hashable PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToJSON PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromJSON PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromHttpApiData PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToHttpApiData PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep PermissionRole Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep PermissionRole = D1 (MetaData "PermissionRole" "Network.Google.AppsActivity.Types.Sum" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) ((C1 (MetaCons "Commenter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Owner" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PublishedReader" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Reader" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Writer" PrefixI False) (U1 :: Type -> Type))))

ListActivitiesResponse

data ListActivitiesResponse Source #

The response from the list request. Contains a list of activities and a token to retrieve the next page of results.

See: listActivitiesResponse smart constructor.

Instances
Eq ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Data ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: ListActivitiesResponse -> Constr #

dataTypeOf :: ListActivitiesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep ListActivitiesResponse :: Type -> Type #

ToJSON ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep ListActivitiesResponse Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep ListActivitiesResponse = D1 (MetaData "ListActivitiesResponse" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "ListActivitiesResponse'" PrefixI True) (S1 (MetaSel (Just "_larNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_larActivities") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Activity]))))

listActivitiesResponse :: ListActivitiesResponse Source #

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

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

larNextPageToken :: Lens' ListActivitiesResponse (Maybe Text) Source #

Token for the next page of results.

PermissionChange

data PermissionChange Source #

Contains information about a Drive object's permissions that changed as a result of a permissionChange type event.

See: permissionChange smart constructor.

Instances
Eq PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Data PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: PermissionChange -> Constr #

dataTypeOf :: PermissionChange -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep PermissionChange :: Type -> Type #

ToJSON PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep PermissionChange Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep PermissionChange = D1 (MetaData "PermissionChange" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "PermissionChange'" PrefixI True) (S1 (MetaSel (Just "_pcAddedPermissions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Permission])) :*: S1 (MetaSel (Just "_pcRemovedPermissions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Permission]))))

permissionChange :: PermissionChange Source #

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

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

pcAddedPermissions :: Lens' PermissionChange [Permission] Source #

Lists all Permission objects added.

pcRemovedPermissions :: Lens' PermissionChange [Permission] Source #

Lists all Permission objects removed.

PermissionType

data PermissionType Source #

Indicates how widely permissions are granted.

Constructors

PTAnyone
anyone
PTDomain
domain
PTGroup
group
PTUser
user
Instances
Enum PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Eq PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Data PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Methods

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

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

toConstr :: PermissionType -> Constr #

dataTypeOf :: PermissionType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Read PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Show PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Generic PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Associated Types

type Rep PermissionType :: Type -> Type #

Hashable PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToJSON PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromJSON PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromHttpApiData PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToHttpApiData PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep PermissionType Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep PermissionType = D1 (MetaData "PermissionType" "Network.Google.AppsActivity.Types.Sum" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) ((C1 (MetaCons "PTAnyone" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PTDomain" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PTGroup" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PTUser" PrefixI False) (U1 :: Type -> Type)))

User

data User Source #

A representation of a user.

See: user smart constructor.

Instances
Eq User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

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 # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

showsPrec :: Int -> User -> ShowS #

show :: User -> String #

showList :: [User] -> ShowS #

Generic User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep User :: Type -> Type #

Methods

from :: User -> Rep User x #

to :: Rep User x -> User #

ToJSON User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep User Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep User = D1 (MetaData "User" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "User'" PrefixI True) ((S1 (MetaSel (Just "_uPhoto") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Photo)) :*: S1 (MetaSel (Just "_uIsDeleted") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_uName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_uIsMe") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_uPermissionId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

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:

uPhoto :: Lens' User (Maybe Photo) Source #

The profile photo of the user. Not present if the user has no profile photo.

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

A boolean which indicates whether the specified User was deleted. If true, name, photo and permission_id will be omitted.

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

The displayable name of the user.

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

Whether the user is the authenticated user.

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

The permission ID associated with this user. Equivalent to the Drive API's permission ID for this user, returned as part of the Drive Permissions resource.

EventAdditionalEventTypesItem

data EventAdditionalEventTypesItem Source #

Constructors

EAETIComment
comment
EAETICreate
create
EAETIEdit
edit
EAETIEmptyTrash
emptyTrash
EAETIMove
move
EAETIPermissionChange
permissionChange
EAETIRename
rename
EAETITrash
trash
EAETIUnknown
unknown
EAETIUntrash
untrash
EAETIUpload
upload
Instances
Enum EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Eq EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Data EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Methods

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

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

toConstr :: EventAdditionalEventTypesItem -> Constr #

dataTypeOf :: EventAdditionalEventTypesItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Read EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Show EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Generic EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Associated Types

type Rep EventAdditionalEventTypesItem :: Type -> Type #

Hashable EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToJSON EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromJSON EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromHttpApiData EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToHttpApiData EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep EventAdditionalEventTypesItem Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep EventAdditionalEventTypesItem = D1 (MetaData "EventAdditionalEventTypesItem" "Network.Google.AppsActivity.Types.Sum" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (((C1 (MetaCons "EAETIComment" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EAETICreate" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "EAETIEdit" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EAETIEmptyTrash" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EAETIMove" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "EAETIPermissionChange" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EAETIRename" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EAETITrash" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "EAETIUnknown" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "EAETIUntrash" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "EAETIUpload" PrefixI False) (U1 :: Type -> Type)))))

Activity

data Activity Source #

An Activity resource is a combined view of multiple events. An activity has a list of individual events and a combined view of the common fields among all events.

See: activity smart constructor.

Instances
Eq Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Data Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Activity -> Constr #

dataTypeOf :: Activity -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Activity :: Type -> Type #

Methods

from :: Activity -> Rep Activity x #

to :: Rep Activity x -> Activity #

ToJSON Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Activity Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Activity = D1 (MetaData "Activity" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "Activity'" PrefixI True) (S1 (MetaSel (Just "_aSingleEvents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Event])) :*: S1 (MetaSel (Just "_aCombinedEvent") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Event))))

activity :: Activity Source #

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

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

aSingleEvents :: Lens' Activity [Event] Source #

A list of all the Events that make up the Activity.

aCombinedEvent :: Lens' Activity (Maybe Event) Source #

The fields common to all of the singleEvents that make up the Activity.

ActivitiesListGroupingStrategy

data ActivitiesListGroupingStrategy Source #

Indicates the strategy to use when grouping singleEvents items in the associated combinedEvent object.

Constructors

DriveUi
driveUi
None
none
Instances
Enum ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Eq ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Data ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Methods

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

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

toConstr :: ActivitiesListGroupingStrategy -> Constr #

dataTypeOf :: ActivitiesListGroupingStrategy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Read ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Show ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Generic ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

Associated Types

type Rep ActivitiesListGroupingStrategy :: Type -> Type #

Hashable ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToJSON ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromJSON ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

FromHttpApiData ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

ToHttpApiData ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep ActivitiesListGroupingStrategy Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Sum

type Rep ActivitiesListGroupingStrategy = D1 (MetaData "ActivitiesListGroupingStrategy" "Network.Google.AppsActivity.Types.Sum" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "DriveUi" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type))

Rename

data Rename Source #

Contains information about a renametype event.

See: rename smart constructor.

Instances
Eq Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Rename -> Constr #

dataTypeOf :: Rename -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Rename :: Type -> Type #

Methods

from :: Rename -> Rep Rename x #

to :: Rep Rename x -> Rename #

ToJSON Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Rename Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Rename = D1 (MetaData "Rename" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "Rename'" PrefixI True) (S1 (MetaSel (Just "_rNewTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_rOldTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

rename :: Rename Source #

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

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

rNewTitle :: Lens' Rename (Maybe Text) Source #

The new title.

rOldTitle :: Lens' Rename (Maybe Text) Source #

The old title.

Permission

data Permission Source #

Contains information about the permissions and type of access allowed with regards to a Google Drive object. This is a subset of the fields contained in a corresponding Drive Permissions object.

See: permission smart constructor.

Instances
Eq Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Data Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

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 # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Permission :: Type -> Type #

ToJSON Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Permission Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

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:

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

Whether the permission requires a link to the file.

pUser :: Lens' Permission (Maybe User) Source #

The user's information if the type is USER.

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

Indicates the Google Drive permissions role. The role determines a user's ability to read, write, or comment on the file.

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

The name of the user or group the permission applies to.

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

Indicates how widely permissions are granted.

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

The ID for this permission. Corresponds to the Drive API's permission ID returned as part of the Drive Permissions resource.

Target

data Target Source #

Information about the object modified by the event.

See: target smart constructor.

Instances
Eq Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Target -> Constr #

dataTypeOf :: Target -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Generic Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Target :: Type -> Type #

Methods

from :: Target -> Rep Target x #

to :: Rep Target x -> Target #

ToJSON Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Target Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Target = D1 (MetaData "Target" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "Target'" PrefixI True) (S1 (MetaSel (Just "_tMimeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_tName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_tId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

target :: Target Source #

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

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

tMimeType :: Lens' Target (Maybe Text) Source #

The MIME type of the target.

tName :: Lens' Target (Maybe Text) Source #

The name of the target. For example, in Google Drive, this is the title of the file.

tId :: Lens' Target (Maybe Text) Source #

The ID of the target. For example, in Google Drive, this is the file or folder ID.

Move

data Move Source #

Contains information about changes in an object's parents as a result of a move type event.

See: move smart constructor.

Instances
Eq Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

Data Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

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

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

toConstr :: Move -> Constr #

dataTypeOf :: Move -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Methods

showsPrec :: Int -> Move -> ShowS #

show :: Move -> String #

showList :: [Move] -> ShowS #

Generic Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

Associated Types

type Rep Move :: Type -> Type #

Methods

from :: Move -> Rep Move x #

to :: Rep Move x -> Move #

ToJSON Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

FromJSON Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Move Source # 
Instance details

Defined in Network.Google.AppsActivity.Types.Product

type Rep Move = D1 (MetaData "Move" "Network.Google.AppsActivity.Types.Product" "gogol-apps-activity-0.4.0-3XjYyCQw6cW3ga9xvxdE9g" False) (C1 (MetaCons "Move'" PrefixI True) (S1 (MetaSel (Just "_mAddedParents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Parent])) :*: S1 (MetaSel (Just "_mRemovedParents") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Parent]))))

move :: Move Source #

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

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

mAddedParents :: Lens' Move [Parent] Source #

The added parent(s).

mRemovedParents :: Lens' Move [Parent] Source #

The removed parent(s).