{-# LANGUAGE DataKinds         #-}
{-# LANGUAGE NoImplicitPrelude #-}
{-# LANGUAGE TypeOperators     #-}
{-# OPTIONS_GHC -fno-warn-unused-imports    #-}
{-# OPTIONS_GHC -fno-warn-duplicate-exports #-}
module Network.Google.Mirror
    (
    
      mirrorService
    
    , glassTimelineScope
    , glassLocationScope
    
    , MirrorAPI
    
    
    , module Network.Google.Resource.Mirror.Accounts.Insert
    
    , module Network.Google.Resource.Mirror.Contacts.Delete
    
    , module Network.Google.Resource.Mirror.Contacts.Get
    
    , module Network.Google.Resource.Mirror.Contacts.Insert
    
    , module Network.Google.Resource.Mirror.Contacts.List
    
    , module Network.Google.Resource.Mirror.Contacts.Patch
    
    , module Network.Google.Resource.Mirror.Contacts.Update
    
    , module Network.Google.Resource.Mirror.Locations.Get
    
    , module Network.Google.Resource.Mirror.Locations.List
    
    , module Network.Google.Resource.Mirror.Settings.Get
    
    , module Network.Google.Resource.Mirror.Subscriptions.Delete
    
    , module Network.Google.Resource.Mirror.Subscriptions.Insert
    
    , module Network.Google.Resource.Mirror.Subscriptions.List
    
    , module Network.Google.Resource.Mirror.Subscriptions.Update
    
    , module Network.Google.Resource.Mirror.Timeline.Attachments.Delete
    
    , module Network.Google.Resource.Mirror.Timeline.Attachments.Get
    
    , module Network.Google.Resource.Mirror.Timeline.Attachments.Insert
    
    , module Network.Google.Resource.Mirror.Timeline.Attachments.List
    
    , module Network.Google.Resource.Mirror.Timeline.Delete
    
    , module Network.Google.Resource.Mirror.Timeline.Get
    
    , module Network.Google.Resource.Mirror.Timeline.Insert
    
    , module Network.Google.Resource.Mirror.Timeline.List
    
    , module Network.Google.Resource.Mirror.Timeline.Patch
    
    , module Network.Google.Resource.Mirror.Timeline.Update
    
    
    , TimelineListOrderBy (..)
    
    , NotificationConfig
    , notificationConfig
    , ncDeliveryTime
    , ncLevel
    
    , Command
    , command
    , cType
    
    , LocationsListResponse
    , locationsListResponse
    , llrKind
    , llrItems
    
    , Location
    , location
    , lKind
    , lLatitude
    , lAddress
    , lDisplayName
    , lId
    , lAccuracy
    , lLongitude
    , lTimestamp
    
    , Notification
    , notification
    , nOperation
    , nItemId
    , nCollection
    , nUserActions
    , nVerifyToken
    , nUserToken
    
    , Contact
    , contact
    , conAcceptCommands
    , conSharingFeatures
    , conImageURLs
    , conPriority
    , conKind
    , conAcceptTypes
    , conPhoneNumber
    , conDisplayName
    , conSource
    , conId
    , conType
    , conSpeakableName
    
    , AuthToken
    , authToken
    , atAuthToken
    , atType
    
    , AttachmentsListResponse
    , attachmentsListResponse
    , alrKind
    , alrItems
    
    , MenuItem
    , menuItem
    , miValues
    , miRemoveWhenSelected
    , miAction
    , miPayload
    , miContextualCommand
    , miId
    
    , Setting
    , setting
    , sKind
    , sValue
    , sId
    
    , Attachment
    , attachment
    , aContentURL
    , aId
    , aIsProcessingContent
    , aContentType
    
    , Account
    , account
    , aAuthTokens
    , aUserData
    , aPassword
    , aFeatures
    
    , UserData
    , userData
    , udValue
    , udKey
    
    , UserAction
    , userAction
    , uaPayload
    , uaType
    
    , TimelineListResponse
    , timelineListResponse
    , tlrNextPageToken
    , tlrKind
    , tlrItems
    
    , ContactsListResponse
    , contactsListResponse
    , clrKind
    , clrItems
    
    , MenuValue
    , menuValue
    , mvState
    , mvDisplayName
    , mvIconURL
    
    , Subscription
    , subscription
    , subCallbackURL
    , subOperation
    , subNotification
    , subKind
    , subCollection
    , subVerifyToken
    , subUserToken
    , subId
    , subUpdated
    
    , TimelineItem
    , timelineItem
    , tiCreator
    , tiDisplayTime
    , tiEtag
    , tiIsDeleted
    , tiPinScore
    , tiAttachments
    , tiLocation
    , tiMenuItems
    , tiNotification
    , tiText
    , tiKind
    , tiCreated
    , tiSpeakableText
    , tiIsBundleCover
    , tiSpeakableType
    , tiBundleId
    , tiCanonicalURL
    , tiSelfLink
    , tiIsPinned
    , tiSourceItemId
    , tiId
    , tiHTML
    , tiUpdated
    , tiRecipients
    , tiTitle
    , tiInReplyTo
    
    , SubscriptionsListResponse
    , subscriptionsListResponse
    , slrKind
    , slrItems
    ) where
import           Network.Google.Mirror.Types
import           Network.Google.Prelude
import           Network.Google.Resource.Mirror.Accounts.Insert
import           Network.Google.Resource.Mirror.Contacts.Delete
import           Network.Google.Resource.Mirror.Contacts.Get
import           Network.Google.Resource.Mirror.Contacts.Insert
import           Network.Google.Resource.Mirror.Contacts.List
import           Network.Google.Resource.Mirror.Contacts.Patch
import           Network.Google.Resource.Mirror.Contacts.Update
import           Network.Google.Resource.Mirror.Locations.Get
import           Network.Google.Resource.Mirror.Locations.List
import           Network.Google.Resource.Mirror.Settings.Get
import           Network.Google.Resource.Mirror.Subscriptions.Delete
import           Network.Google.Resource.Mirror.Subscriptions.Insert
import           Network.Google.Resource.Mirror.Subscriptions.List
import           Network.Google.Resource.Mirror.Subscriptions.Update
import           Network.Google.Resource.Mirror.Timeline.Attachments.Delete
import           Network.Google.Resource.Mirror.Timeline.Attachments.Get
import           Network.Google.Resource.Mirror.Timeline.Attachments.Insert
import           Network.Google.Resource.Mirror.Timeline.Attachments.List
import           Network.Google.Resource.Mirror.Timeline.Delete
import           Network.Google.Resource.Mirror.Timeline.Get
import           Network.Google.Resource.Mirror.Timeline.Insert
import           Network.Google.Resource.Mirror.Timeline.List
import           Network.Google.Resource.Mirror.Timeline.Patch
import           Network.Google.Resource.Mirror.Timeline.Update
type MirrorAPI =
     AccountsInsertResource :<|> SettingsGetResource :<|>
       SubscriptionsInsertResource
       :<|> SubscriptionsListResource
       :<|> SubscriptionsDeleteResource
       :<|> SubscriptionsUpdateResource
       :<|> TimelineAttachmentsInsertResource
       :<|> TimelineAttachmentsListResource
       :<|> TimelineAttachmentsGetResource
       :<|> TimelineAttachmentsDeleteResource
       :<|> TimelineInsertResource
       :<|> TimelineListResource
       :<|> TimelinePatchResource
       :<|> TimelineGetResource
       :<|> TimelineDeleteResource
       :<|> TimelineUpdateResource
       :<|> ContactsInsertResource
       :<|> ContactsListResource
       :<|> ContactsPatchResource
       :<|> ContactsGetResource
       :<|> ContactsDeleteResource
       :<|> ContactsUpdateResource
       :<|> LocationsListResource
       :<|> LocationsGetResource