gogol-appstate-0.3.0: Google App State 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.AppState.Types

Contents

Description

 

Synopsis

Service Configuration

appStateService :: ServiceConfig Source #

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

OAuth Scopes

appStateScope :: Proxy '["https://www.googleapis.com/auth/appstate"] Source #

View and manage your data for this application

WriteResult

data WriteResult Source #

This is a JSON template for an app state write result.

See: writeResult smart constructor.

Instances

Eq WriteResult Source # 
Data WriteResult Source # 

Methods

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

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

toConstr :: WriteResult -> Constr #

dataTypeOf :: WriteResult -> DataType #

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

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

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

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

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

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

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

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

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

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

Show WriteResult Source # 
Generic WriteResult Source # 

Associated Types

type Rep WriteResult :: * -> * #

ToJSON WriteResult Source # 
FromJSON WriteResult Source # 
type Rep WriteResult Source # 
type Rep WriteResult = D1 (MetaData "WriteResult" "Network.Google.AppState.Types.Product" "gogol-appstate-0.3.0-DYTWXoCf2YjALUvm4HhtpZ" False) (C1 (MetaCons "WriteResult'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_wrCurrentStateVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_wrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_wrStateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

writeResult :: WriteResult Source #

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

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

wrCurrentStateVersion :: Lens' WriteResult (Maybe Text) Source #

The version of the data for this key on the server.

wrKind :: Lens' WriteResult Text Source #

Uniquely identifies the type of this resource. Value is always the fixed string appstate#writeResult.

ListResponse

data ListResponse Source #

This is a JSON template to convert a list-response for app state.

See: listResponse smart constructor.

Instances

Eq ListResponse Source # 
Data ListResponse Source # 

Methods

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

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

toConstr :: ListResponse -> Constr #

dataTypeOf :: ListResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ListResponse Source # 
Generic ListResponse Source # 

Associated Types

type Rep ListResponse :: * -> * #

ToJSON ListResponse Source # 
FromJSON ListResponse Source # 
type Rep ListResponse Source # 
type Rep ListResponse = D1 (MetaData "ListResponse" "Network.Google.AppState.Types.Product" "gogol-appstate-0.3.0-DYTWXoCf2YjALUvm4HhtpZ" False) (C1 (MetaCons "ListResponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_lrMaximumKeyCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) ((:*:) (S1 (MetaSel (Just Symbol "_lrKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_lrItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GetResponse]))))))

listResponse :: ListResponse Source #

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

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

lrMaximumKeyCount :: Lens' ListResponse (Maybe Int32) Source #

The maximum number of keys allowed for this user.

lrKind :: Lens' ListResponse Text Source #

Uniquely identifies the type of this resource. Value is always the fixed string appstate#listResponse.

lrItems :: Lens' ListResponse [GetResponse] Source #

The app state data.

GetResponse

data GetResponse Source #

This is a JSON template for an app state resource.

See: getResponse smart constructor.

Instances

Eq GetResponse Source # 
Data GetResponse Source # 

Methods

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

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

toConstr :: GetResponse -> Constr #

dataTypeOf :: GetResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GetResponse Source # 
Generic GetResponse Source # 

Associated Types

type Rep GetResponse :: * -> * #

ToJSON GetResponse Source # 
FromJSON GetResponse Source # 
type Rep GetResponse Source # 
type Rep GetResponse = D1 (MetaData "GetResponse" "Network.Google.AppState.Types.Product" "gogol-appstate-0.3.0-DYTWXoCf2YjALUvm4HhtpZ" False) (C1 (MetaCons "GetResponse'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_grCurrentStateVersion") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_grKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))) ((:*:) (S1 (MetaSel (Just Symbol "_grData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_grStateKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

getResponse :: GetResponse Source #

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

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

grCurrentStateVersion :: Lens' GetResponse (Maybe Text) Source #

The current app state version.

grKind :: Lens' GetResponse Text Source #

Uniquely identifies the type of this resource. Value is always the fixed string appstate#getResponse.

grData :: Lens' GetResponse (Maybe Text) Source #

The requested data.

grStateKey :: Lens' GetResponse (Maybe Int32) Source #

The key for the data.

UpdateRequest

data UpdateRequest Source #

This is a JSON template for a requests which update app state

See: updateRequest smart constructor.

Instances

Eq UpdateRequest Source # 
Data UpdateRequest Source # 

Methods

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

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

toConstr :: UpdateRequest -> Constr #

dataTypeOf :: UpdateRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateRequest Source # 
Generic UpdateRequest Source # 

Associated Types

type Rep UpdateRequest :: * -> * #

ToJSON UpdateRequest Source # 
FromJSON UpdateRequest Source # 
type Rep UpdateRequest Source # 
type Rep UpdateRequest = D1 (MetaData "UpdateRequest" "Network.Google.AppState.Types.Product" "gogol-appstate-0.3.0-DYTWXoCf2YjALUvm4HhtpZ" False) (C1 (MetaCons "UpdateRequest'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_urKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_urData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

updateRequest :: UpdateRequest Source #

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

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

urKind :: Lens' UpdateRequest Text Source #

Uniquely identifies the type of this resource. Value is always the fixed string appstate#updateRequest.

urData :: Lens' UpdateRequest (Maybe Text) Source #

The new app state data that your application is trying to update with.