{-# LANGUAGE DataKinds #-}
{-# LANGUAGE DeriveDataTypeable #-}
{-# LANGUAGE DeriveGeneric #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module Network.Google.PhotosLibrary.Types
(
photosLibraryService
, photosLibraryReadOnlyScope
, photosLibraryScope
, drivePhotosReadOnlyScope
, photosLibrarySharingScope
, photosLibraryAppendOnlyScope
, photosLibraryReadOnlyAppcreatedDataScope
, LatLng
, latLng
, llLatitude
, llLongitude
, LocationEnrichment
, locationEnrichment
, leLocation
, DateFilter
, dateFilter
, dfDates
, dfRanges
, Photo
, photo
, pFocalLength
, pCameraMake
, pExposureTime
, pCameraModel
, pIsoEquivalent
, pApertureFNumber
, TextEnrichment
, textEnrichment
, teText
, Status
, status
, sDetails
, sCode
, sMessage
, AddEnrichmentToAlbumResponse
, addEnrichmentToAlbumResponse
, aetarEnrichmentItem
, SearchMediaItemsResponse
, searchMediaItemsResponse
, smirNextPageToken
, smirMediaItems
, JoinSharedAlbumResponse
, joinSharedAlbumResponse
, CreateAlbumRequest
, createAlbumRequest
, carAlbum
, Location
, location
, lLatlng
, lLocationName
, VideoStatus (..)
, NewEnrichmentItem
, newEnrichmentItem
, neiLocationEnrichment
, neiTextEnrichment
, neiMapEnrichment
, ShareInfo
, shareInfo
, siShareableURL
, siShareToken
, siSharedAlbumOptions
, BatchCreateMediaItemsRequest
, batchCreateMediaItemsRequest
, bcmirAlbumId
, bcmirNewMediaItems
, bcmirAlbumPosition
, Filters
, filters
, fDateFilter
, fIncludeArchivedMedia
, fMediaTypeFilter
, fContentFilter
, StatusDetailsItem
, statusDetailsItem
, sdiAddtional
, DateRange
, dateRange
, drEndDate
, drStartDate
, SharedAlbumOptions
, sharedAlbumOptions
, saoIsCollaborative
, saoIsCommentable
, MediaMetadata
, mediaMetadata
, mmCreationTime
, mmPhoto
, mmHeight
, mmWidth
, mmVideo
, ShareAlbumResponse
, shareAlbumResponse
, sarShareInfo
, Video
, video
, vStatus
, vCameraMake
, vCameraModel
, vFps
, MediaItem
, mediaItem
, miProductURL
, miBaseURL
, miMediaMetadata
, miMimeType
, miId
, miContributorInfo
, miDescription
, Date
, date
, dDay
, dYear
, dMonth
, EnrichmentItem
, enrichmentItem
, eiId
, ListSharedAlbumsResponse
, listSharedAlbumsResponse
, lsarNextPageToken
, lsarSharedAlbums
, MediaTypeFilter
, mediaTypeFilter
, mtfMediaTypes
, NewMediaItemResult
, newMediaItemResult
, nmirStatus
, nmirUploadToken
, nmirMediaItem
, Album
, album
, aIsWriteable
, aProductURL
, aShareInfo
, aCoverPhotoBaseURL
, aId
, aTotalMediaItems
, aTitle
, SimpleMediaItem
, simpleMediaItem
, smiUploadToken
, AlbumPositionPosition (..)
, Xgafv (..)
, ContributorInfo
, contributorInfo
, ciProFilePictureBaseURL
, ciDisplayName
, ListAlbumsResponse
, listAlbumsResponse
, larNextPageToken
, larAlbums
, MapEnrichment
, mapEnrichment
, meDestination
, meOrigin
, SearchMediaItemsRequest
, searchMediaItemsRequest
, smirAlbumId
, smirFilters
, smirPageToken
, smirPageSize
, NewMediaItem
, newMediaItem
, nmiSimpleMediaItem
, nmiDescription
, AddEnrichmentToAlbumRequest
, addEnrichmentToAlbumRequest
, aetarNewEnrichmentItem
, aetarAlbumPosition
, JoinSharedAlbumRequest
, joinSharedAlbumRequest
, jsarShareToken
, ShareAlbumRequest
, shareAlbumRequest
, sarSharedAlbumOptions
, AlbumPosition
, albumPosition
, apRelativeMediaItemId
, apRelativeEnrichmentItemId
, apPosition
, ContentFilter
, contentFilter
, cfIncludedContentCategories
, cfExcludedContentCategories
, BatchCreateMediaItemsResponse
, batchCreateMediaItemsResponse
, bcmirNewMediaItemResults
) where
import Network.Google.PhotosLibrary.Types.Product
import Network.Google.PhotosLibrary.Types.Sum
import Network.Google.Prelude
photosLibraryService :: ServiceConfig
photosLibraryService
= defaultService (ServiceId "photoslibrary:v1")
"photoslibrary.googleapis.com"
photosLibraryReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/photoslibrary.readonly"]
photosLibraryReadOnlyScope = Proxy;
photosLibraryScope :: Proxy '["https://www.googleapis.com/auth/photoslibrary"]
photosLibraryScope = Proxy;
drivePhotosReadOnlyScope :: Proxy '["https://www.googleapis.com/auth/drive.photos.readonly"]
drivePhotosReadOnlyScope = Proxy;
photosLibrarySharingScope :: Proxy '["https://www.googleapis.com/auth/photoslibrary.sharing"]
photosLibrarySharingScope = Proxy;
photosLibraryAppendOnlyScope :: Proxy '["https://www.googleapis.com/auth/photoslibrary.appendonly"]
photosLibraryAppendOnlyScope = Proxy;
photosLibraryReadOnlyAppcreatedDataScope :: Proxy '["https://www.googleapis.com/auth/photoslibrary.readonly.appcreateddata"]
photosLibraryReadOnlyAppcreatedDataScope = Proxy;