gogol-fusiontables-0.3.0: Google Fusion Tables 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.FusionTables

Contents

Description

API for working with Fusion Tables data.

See: Fusion Tables API Reference

Synopsis

Service Configuration

fusionTablesService :: ServiceConfig Source #

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

OAuth Scopes

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

View your Fusion Tables

fusionTablesScope :: Proxy '["https://www.googleapis.com/auth/fusiontables"] Source #

Manage your Fusion Tables

API Declaration

Resources

fusiontables.column.delete

fusiontables.column.get

fusiontables.column.insert

fusiontables.column.list

fusiontables.column.patch

fusiontables.column.update

fusiontables.query.sql

fusiontables.query.sqlGet

fusiontables.style.delete

fusiontables.style.get

fusiontables.style.insert

fusiontables.style.list

fusiontables.style.patch

fusiontables.style.update

fusiontables.table.copy

fusiontables.table.delete

fusiontables.table.get

fusiontables.table.importRows

fusiontables.table.importTable

fusiontables.table.insert

fusiontables.table.list

fusiontables.table.patch

fusiontables.table.replaceRows

fusiontables.table.update

fusiontables.task.delete

fusiontables.task.get

fusiontables.task.list

fusiontables.template.delete

fusiontables.template.get

fusiontables.template.insert

fusiontables.template.list

fusiontables.template.patch

fusiontables.template.update

Types

ColumnList

data ColumnList Source #

Represents a list of columns in a table.

See: columnList smart constructor.

Instances

Eq ColumnList Source # 
Data ColumnList Source # 

Methods

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

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

toConstr :: ColumnList -> Constr #

dataTypeOf :: ColumnList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ColumnList Source # 
Generic ColumnList Source # 

Associated Types

type Rep ColumnList :: * -> * #

ToJSON ColumnList Source # 
FromJSON ColumnList Source # 
type Rep ColumnList Source # 
type Rep ColumnList = D1 (MetaData "ColumnList" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "ColumnList'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_clTotalItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_clNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_clKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_clItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Column]))))))

columnList :: ColumnList Source #

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

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

clTotalItems :: Lens' ColumnList (Maybe Int32) Source #

Total number of columns for the table.

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

Token used to access the next page of this result. No token is displayed if there are no more pages left.

clKind :: Lens' ColumnList Text Source #

The kind of item this is. For a column list, this is always fusiontables#columnList.

clItems :: Lens' ColumnList [Column] Source #

List of all requested columns.

TableList

data TableList Source #

Represents a list of tables.

See: tableList smart constructor.

Instances

Eq TableList Source # 
Data TableList Source # 

Methods

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

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

toConstr :: TableList -> Constr #

dataTypeOf :: TableList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TableList Source # 
Generic TableList Source # 

Associated Types

type Rep TableList :: * -> * #

ToJSON TableList Source # 
FromJSON TableList Source # 
type Rep TableList Source # 
type Rep TableList = D1 (MetaData "TableList" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "TableList'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_tlNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_tlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_tlItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Table]))))))

tableList :: TableList Source #

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

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

tlNextPageToken :: Lens' TableList (Maybe Text) Source #

Token used to access the next page of this result. No token is displayed if there are no more pages left.

tlKind :: Lens' TableList Text Source #

The kind of item this is. For table list, this is always fusiontables#tableList.

tlItems :: Lens' TableList [Table] Source #

List of all requested tables.

StyleFunction

data StyleFunction Source #

Represents a StyleFunction within a StyleSetting

See: styleFunction smart constructor.

Instances

Eq StyleFunction Source # 
Data StyleFunction Source # 

Methods

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

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

toConstr :: StyleFunction -> Constr #

dataTypeOf :: StyleFunction -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StyleFunction Source # 
Generic StyleFunction Source # 

Associated Types

type Rep StyleFunction :: * -> * #

ToJSON StyleFunction Source # 
FromJSON StyleFunction Source # 
type Rep StyleFunction Source # 
type Rep StyleFunction = D1 (MetaData "StyleFunction" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "StyleFunction'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_sfBuckets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Bucket]))) (S1 (MetaSel (Just Symbol "_sfKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_sfGradient") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StyleFunctionGradient))) (S1 (MetaSel (Just Symbol "_sfColumnName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

styleFunction :: StyleFunction Source #

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

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

sfBuckets :: Lens' StyleFunction [Bucket] Source #

Bucket function that assigns a style based on the range a column value falls into.

sfKind :: Lens' StyleFunction (Maybe Text) Source #

Stylers can be one of three kinds: "fusiontables#fromColumn if the column value is to be used as is, i.e., the column values can have colors in #RRGGBBAA format or integer line widths or icon names; fusiontables#gradient if the styling of the row is to be based on applying the gradient function on the column value; or fusiontables#buckets if the styling is to based on the bucket into which the the column value falls.

sfGradient :: Lens' StyleFunction (Maybe StyleFunctionGradient) Source #

Gradient function that interpolates a range of colors based on column value.

sfColumnName :: Lens' StyleFunction (Maybe Text) Source #

Name of the column whose value is used in the style.

ColumnBaseColumn

data ColumnBaseColumn Source #

Identifier of the base column. If present, this column is derived from the specified base column.

See: columnBaseColumn smart constructor.

Instances

Eq ColumnBaseColumn Source # 
Data ColumnBaseColumn Source # 

Methods

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

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

toConstr :: ColumnBaseColumn -> Constr #

dataTypeOf :: ColumnBaseColumn -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ColumnBaseColumn Source # 
Generic ColumnBaseColumn Source # 
ToJSON ColumnBaseColumn Source # 
FromJSON ColumnBaseColumn Source # 
type Rep ColumnBaseColumn Source # 
type Rep ColumnBaseColumn = D1 (MetaData "ColumnBaseColumn" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "ColumnBaseColumn'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_cbcTableIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_cbcColumnId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

columnBaseColumn :: ColumnBaseColumn Source #

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

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

cbcTableIndex :: Lens' ColumnBaseColumn (Maybe Int32) Source #

Offset to the entry in the list of base tables in the table definition.

cbcColumnId :: Lens' ColumnBaseColumn (Maybe Int32) Source #

The id of the column in the base table from which this column is derived.

SQLresponse

data SQLresponse Source #

Represents a response to a SQL statement.

See: sQLresponse smart constructor.

Instances

Eq SQLresponse Source # 
Data SQLresponse Source # 

Methods

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

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

toConstr :: SQLresponse -> Constr #

dataTypeOf :: SQLresponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SQLresponse Source # 
Generic SQLresponse Source # 

Associated Types

type Rep SQLresponse :: * -> * #

ToJSON SQLresponse Source # 
FromJSON SQLresponse Source # 
type Rep SQLresponse Source # 
type Rep SQLresponse = D1 (MetaData "SQLresponse" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "SQLresponse'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sqlKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) ((:*:) (S1 (MetaSel (Just Symbol "_sqlRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [[JSONValue]]))) (S1 (MetaSel (Just Symbol "_sqlColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))))))

sQLresponse :: SQLresponse Source #

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

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

sqlKind :: Lens' SQLresponse Text Source #

The kind of item this is. For responses to SQL queries, this is always fusiontables#sqlresponse.

sqlRows :: Lens' SQLresponse [[JSONValue]] Source #

The rows in the table. For each cell we print out whatever cell value (e.g., numeric, string) exists. Thus it is important that each cell contains only one value.

sqlColumns :: Lens' SQLresponse [Text] Source #

Columns in the table.

StyleFunctionGradientColorsItem

data StyleFunctionGradientColorsItem Source #

Instances

Eq StyleFunctionGradientColorsItem Source # 
Data StyleFunctionGradientColorsItem Source # 

Methods

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

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

toConstr :: StyleFunctionGradientColorsItem -> Constr #

dataTypeOf :: StyleFunctionGradientColorsItem -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StyleFunctionGradientColorsItem Source # 
Generic StyleFunctionGradientColorsItem Source # 
ToJSON StyleFunctionGradientColorsItem Source # 
FromJSON StyleFunctionGradientColorsItem Source # 
type Rep StyleFunctionGradientColorsItem Source # 
type Rep StyleFunctionGradientColorsItem = D1 (MetaData "StyleFunctionGradientColorsItem" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "StyleFunctionGradientColorsItem'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sfgciColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_sfgciOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))))))

styleFunctionGradientColorsItem :: StyleFunctionGradientColorsItem Source #

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

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

sfgciOpacity :: Lens' StyleFunctionGradientColorsItem (Maybe Double) Source #

Opacity of the color: 0.0 (transparent) to 1.0 (opaque).

StyleSettingList

data StyleSettingList Source #

Represents a list of styles for a given table.

See: styleSettingList smart constructor.

Instances

Eq StyleSettingList Source # 
Data StyleSettingList Source # 

Methods

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

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

toConstr :: StyleSettingList -> Constr #

dataTypeOf :: StyleSettingList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StyleSettingList Source # 
Generic StyleSettingList Source # 
ToJSON StyleSettingList Source # 
FromJSON StyleSettingList Source # 
type Rep StyleSettingList Source # 
type Rep StyleSettingList = D1 (MetaData "StyleSettingList" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "StyleSettingList'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_sslTotalItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_sslNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_sslKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_sslItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StyleSetting]))))))

styleSettingList :: StyleSettingList Source #

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

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

sslTotalItems :: Lens' StyleSettingList (Maybe Int32) Source #

Total number of styles for the table.

sslNextPageToken :: Lens' StyleSettingList (Maybe Text) Source #

Token used to access the next page of this result. No token is displayed if there are no more styles left.

sslKind :: Lens' StyleSettingList Text Source #

The kind of item this is. For a style list, this is always fusiontables#styleSettingList .

sslItems :: Lens' StyleSettingList [StyleSetting] Source #

All requested style settings.

Bucket

data Bucket Source #

Specifies the minimum and maximum values, the color, opacity, icon and weight of a bucket within a StyleSetting.

See: bucket smart constructor.

Instances

Eq Bucket Source # 

Methods

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

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

Data Bucket Source # 

Methods

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

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

toConstr :: Bucket -> Constr #

dataTypeOf :: Bucket -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Bucket Source # 
Generic Bucket Source # 

Associated Types

type Rep Bucket :: * -> * #

Methods

from :: Bucket -> Rep Bucket x #

to :: Rep Bucket x -> Bucket #

ToJSON Bucket Source # 
FromJSON Bucket Source # 
type Rep Bucket Source # 

bucket :: Bucket Source #

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

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

bMax :: Lens' Bucket (Maybe Double) Source #

Maximum value in the selected column for a row to be styled according to the bucket color, opacity, icon, or weight.

bColor :: Lens' Bucket (Maybe Text) Source #

Color of line or the interior of a polygon in #RRGGBB format.

bWeight :: Lens' Bucket (Maybe Int32) Source #

Width of a line (in pixels).

bIcon :: Lens' Bucket (Maybe Text) Source #

Icon name used for a point.

bOpacity :: Lens' Bucket (Maybe Double) Source #

Opacity of the color: 0.0 (transparent) to 1.0 (opaque).

bMin :: Lens' Bucket (Maybe Double) Source #

Minimum value in the selected column for a row to be styled according to the bucket color, opacity, icon, or weight.

Line

data Line Source #

Represents a line geometry.

See: line smart constructor.

Instances

Eq Line Source # 

Methods

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

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

Data Line Source # 

Methods

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

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

toConstr :: Line -> Constr #

dataTypeOf :: Line -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Line Source # 

Methods

showsPrec :: Int -> Line -> ShowS #

show :: Line -> String #

showList :: [Line] -> ShowS #

Generic Line Source # 

Associated Types

type Rep Line :: * -> * #

Methods

from :: Line -> Rep Line x #

to :: Rep Line x -> Line #

ToJSON Line Source # 
FromJSON Line Source # 
type Rep Line Source # 
type Rep Line = D1 (MetaData "Line" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Line'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_lCoordinates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [[Textual Double]]))) (S1 (MetaSel (Just Symbol "_lType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

line :: Line Source #

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

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

lCoordinates :: Lens' Line [[Double]] Source #

The coordinates that define the line.

lType :: Lens' Line Text Source #

Type: A line geometry.

StyleSetting

data StyleSetting Source #

Represents a complete StyleSettings object. The primary key is a combination of the tableId and a styleId.

See: styleSetting smart constructor.

Instances

Eq StyleSetting Source # 
Data StyleSetting Source # 

Methods

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

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

toConstr :: StyleSetting -> Constr #

dataTypeOf :: StyleSetting -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StyleSetting Source # 
Generic StyleSetting Source # 

Associated Types

type Rep StyleSetting :: * -> * #

ToJSON StyleSetting Source # 
FromJSON StyleSetting Source # 
type Rep StyleSetting Source # 

styleSetting :: StyleSetting Source #

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

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

ssPolylineOptions :: Lens' StyleSetting (Maybe LineStyle) Source #

Style definition for lines in the table.

ssPolygonOptions :: Lens' StyleSetting (Maybe PolygonStyle) Source #

Style definition for polygons in the table.

ssMarkerOptions :: Lens' StyleSetting (Maybe PointStyle) Source #

Style definition for points in the table.

ssKind :: Lens' StyleSetting Text Source #

The kind of item this is. A StyleSetting contains the style definitions for points, lines, and polygons in a table. Since a table can have any one or all of them, a style definition can have point, line and polygon style definitions.

ssName :: Lens' StyleSetting (Maybe Text) Source #

Optional name for the style setting.

ssStyleId :: Lens' StyleSetting (Maybe Int32) Source #

Identifier for the style setting (unique only within tables).

ssTableId :: Lens' StyleSetting (Maybe Text) Source #

Identifier for the table.

Point

data Point Source #

Represents a point object.

See: point smart constructor.

Instances

Eq Point Source # 

Methods

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

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

Data Point Source # 

Methods

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

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

toConstr :: Point -> Constr #

dataTypeOf :: Point -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Point Source # 

Methods

showsPrec :: Int -> Point -> ShowS #

show :: Point -> String #

showList :: [Point] -> ShowS #

Generic Point Source # 

Associated Types

type Rep Point :: * -> * #

Methods

from :: Point -> Rep Point x #

to :: Rep Point x -> Point #

ToJSON Point Source # 
FromJSON Point Source # 
type Rep Point Source # 
type Rep Point = D1 (MetaData "Point" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Point'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_pCoordinates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Textual Double]))) (S1 (MetaSel (Just Symbol "_pType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

point :: Point Source #

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

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

pCoordinates :: Lens' Point [Double] Source #

The coordinates that define the point.

pType :: Lens' Point Text Source #

Point: A point geometry.

Polygon

data Polygon Source #

Represents a polygon object.

See: polygon smart constructor.

Instances

Eq Polygon Source # 

Methods

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

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

Data Polygon Source # 

Methods

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

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

toConstr :: Polygon -> Constr #

dataTypeOf :: Polygon -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Polygon Source # 
Generic Polygon Source # 

Associated Types

type Rep Polygon :: * -> * #

Methods

from :: Polygon -> Rep Polygon x #

to :: Rep Polygon x -> Polygon #

ToJSON Polygon Source # 
FromJSON Polygon Source # 
type Rep Polygon Source # 
type Rep Polygon = D1 (MetaData "Polygon" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Polygon'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_polCoordinates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [[[Textual Double]]]))) (S1 (MetaSel (Just Symbol "_polType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text))))

polygon :: Polygon Source #

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

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

polCoordinates :: Lens' Polygon [[[Double]]] Source #

The coordinates that define the polygon.

polType :: Lens' Polygon Text Source #

Type: A polygon geometry.

TaskList

data TaskList Source #

Represents a list of tasks for a table.

See: taskList smart constructor.

Instances

Eq TaskList Source # 
Data TaskList Source # 

Methods

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

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

toConstr :: TaskList -> Constr #

dataTypeOf :: TaskList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TaskList Source # 
Generic TaskList Source # 

Associated Types

type Rep TaskList :: * -> * #

Methods

from :: TaskList -> Rep TaskList x #

to :: Rep TaskList x -> TaskList #

ToJSON TaskList Source # 
FromJSON TaskList Source # 
type Rep TaskList Source # 
type Rep TaskList = D1 (MetaData "TaskList" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "TaskList'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tTotalItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_tNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_tKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_tItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Task]))))))

taskList :: TaskList Source #

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

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

tTotalItems :: Lens' TaskList (Maybe Int32) Source #

Total number of tasks for the table.

tNextPageToken :: Lens' TaskList (Maybe Text) Source #

Token used to access the next page of this result. No token is displayed if there are no more pages left.

tKind :: Lens' TaskList Text Source #

Type of the resource. This is always "fusiontables#taskList".

tItems :: Lens' TaskList [Task] Source #

List of all requested tasks.

Geometry

data Geometry Source #

Represents a Geometry object.

See: geometry smart constructor.

Instances

Eq Geometry Source # 
Data Geometry Source # 

Methods

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

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

toConstr :: Geometry -> Constr #

dataTypeOf :: Geometry -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Geometry Source # 
Generic Geometry Source # 

Associated Types

type Rep Geometry :: * -> * #

Methods

from :: Geometry -> Rep Geometry x #

to :: Rep Geometry x -> Geometry #

ToJSON Geometry Source # 
FromJSON Geometry Source # 
type Rep Geometry Source # 
type Rep Geometry = D1 (MetaData "Geometry" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Geometry'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_gGeometries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [JSONValue]))) ((:*:) (S1 (MetaSel (Just Symbol "_gGeometry") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe JSONValue))) (S1 (MetaSel (Just Symbol "_gType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))))

geometry :: Geometry Source #

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

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

gGeometries :: Lens' Geometry [JSONValue] Source #

The list of geometries in this geometry collection.

gType :: Lens' Geometry Text Source #

Type: A collection of geometries.

TemplateList

data TemplateList Source #

Represents a list of templates for a given table.

See: templateList smart constructor.

Instances

Eq TemplateList Source # 
Data TemplateList Source # 

Methods

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

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

toConstr :: TemplateList -> Constr #

dataTypeOf :: TemplateList -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TemplateList Source # 
Generic TemplateList Source # 

Associated Types

type Rep TemplateList :: * -> * #

ToJSON TemplateList Source # 
FromJSON TemplateList Source # 
type Rep TemplateList Source # 
type Rep TemplateList = D1 (MetaData "TemplateList" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "TemplateList'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_temTotalItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_temNextPageToken") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_temKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_temItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Template]))))))

templateList :: TemplateList Source #

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

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

temTotalItems :: Lens' TemplateList (Maybe Int32) Source #

Total number of templates for the table.

temNextPageToken :: Lens' TemplateList (Maybe Text) Source #

Token used to access the next page of this result. No token is displayed if there are no more pages left.

temKind :: Lens' TemplateList Text Source #

The kind of item this is. For a template list, this is always fusiontables#templateList .

temItems :: Lens' TemplateList [Template] Source #

List of all requested templates.

Import

data Import Source #

Represents an import request.

See: import' smart constructor.

Instances

Eq Import Source # 

Methods

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

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

Data Import Source # 

Methods

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

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

toConstr :: Import -> Constr #

dataTypeOf :: Import -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Import Source # 
Generic Import Source # 

Associated Types

type Rep Import :: * -> * #

Methods

from :: Import -> Rep Import x #

to :: Rep Import x -> Import #

ToJSON Import Source # 
FromJSON Import Source # 
type Rep Import Source # 
type Rep Import = D1 (MetaData "Import" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Import'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_iKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_iNumRowsReceived") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))))

import' :: Import Source #

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

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

iKind :: Lens' Import Text Source #

The kind of item this is. For an import, this is always fusiontables#import.

iNumRowsReceived :: Lens' Import (Maybe Int64) Source #

The number of rows received from the import request.

Task

data Task Source #

A background task on a table, initiated for time- or resource-consuming operations such as changing column types or deleting all rows.

See: task smart constructor.

Instances

Eq Task Source # 

Methods

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

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

Data Task Source # 

Methods

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

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

toConstr :: Task -> Constr #

dataTypeOf :: Task -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Task Source # 

Methods

showsPrec :: Int -> Task -> ShowS #

show :: Task -> String #

showList :: [Task] -> ShowS #

Generic Task Source # 

Associated Types

type Rep Task :: * -> * #

Methods

from :: Task -> Rep Task x #

to :: Rep Task x -> Task #

ToJSON Task Source # 
FromJSON Task Source # 
type Rep Task Source # 
type Rep Task = D1 (MetaData "Task" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Task'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tasProgress") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tasTaskId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int64))))) ((:*:) (S1 (MetaSel (Just Symbol "_tasKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) ((:*:) (S1 (MetaSel (Just Symbol "_tasType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tasStarted") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))))

task :: Task Source #

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

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

tasProgress :: Lens' Task (Maybe Text) Source #

Task percentage completion.

tasTaskId :: Lens' Task (Maybe Int64) Source #

Identifier for the task.

tasKind :: Lens' Task Text Source #

Type of the resource. This is always "fusiontables#task".

tasType :: Lens' Task (Maybe Text) Source #

Type of background task.

tasStarted :: Lens' Task (Maybe Bool) Source #

false while the table is busy with some other task. true if this background task is currently running.

Template

data Template Source #

Represents the contents of InfoWindow templates.

See: template smart constructor.

Instances

Eq Template Source # 
Data Template Source # 

Methods

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

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

toConstr :: Template -> Constr #

dataTypeOf :: Template -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Template Source # 
Generic Template Source # 

Associated Types

type Rep Template :: * -> * #

Methods

from :: Template -> Rep Template x #

to :: Rep Template x -> Template #

ToJSON Template Source # 
FromJSON Template Source # 
type Rep Template Source # 
type Rep Template = D1 (MetaData "Template" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Template'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_ttAutomaticColumnNames") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) ((:*:) (S1 (MetaSel (Just Symbol "_ttTemplateId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) (S1 (MetaSel (Just Symbol "_ttKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_ttBody") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_ttName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_ttTableId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

template :: Template Source #

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

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

ttAutomaticColumnNames :: Lens' Template [Text] Source #

List of columns from which the template is to be automatically constructed. Only one of body or automaticColumns can be specified.

ttTemplateId :: Lens' Template (Maybe Int32) Source #

Identifier for the template, unique within the context of a particular table.

ttKind :: Lens' Template Text Source #

The kind of item this is. For a template, this is always fusiontables#template.

ttBody :: Lens' Template (Maybe Text) Source #

Body of the template. It contains HTML with {column_name} to insert values from a particular column. The body is sanitized to remove certain tags, e.g., script. Only one of body or automaticColumns can be specified.

ttName :: Lens' Template (Maybe Text) Source #

Optional name assigned to a template.

ttTableId :: Lens' Template (Maybe Text) Source #

Identifier for the table for which the template is defined.

PointStyle

data PointStyle Source #

Represents a PointStyle within a StyleSetting

See: pointStyle smart constructor.

Instances

Eq PointStyle Source # 
Data PointStyle Source # 

Methods

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

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

toConstr :: PointStyle -> Constr #

dataTypeOf :: PointStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PointStyle Source # 
Generic PointStyle Source # 

Associated Types

type Rep PointStyle :: * -> * #

ToJSON PointStyle Source # 
FromJSON PointStyle Source # 
type Rep PointStyle Source # 
type Rep PointStyle = D1 (MetaData "PointStyle" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "PointStyle'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_psIconName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_psIconStyler") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StyleFunction)))))

pointStyle :: PointStyle Source #

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

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

psIconName :: Lens' PointStyle (Maybe Text) Source #

Name of the icon. Use values defined in http://www.google.com/fusiontables/DataSource?dsrcid=308519

psIconStyler :: Lens' PointStyle (Maybe StyleFunction) Source #

Column or a bucket value from which the icon name is to be determined.

PolygonStyle

data PolygonStyle Source #

Represents a PolygonStyle within a StyleSetting

See: polygonStyle smart constructor.

Instances

Eq PolygonStyle Source # 
Data PolygonStyle Source # 

Methods

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

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

toConstr :: PolygonStyle -> Constr #

dataTypeOf :: PolygonStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PolygonStyle Source # 
Generic PolygonStyle Source # 

Associated Types

type Rep PolygonStyle :: * -> * #

ToJSON PolygonStyle Source # 
FromJSON PolygonStyle Source # 
type Rep PolygonStyle Source # 

polygonStyle :: PolygonStyle Source #

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

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

psFillColorStyler :: Lens' PolygonStyle (Maybe StyleFunction) Source #

Column-value, gradient, or bucket styler that is used to determine the interior color and opacity of the polygon.

psFillColor :: Lens' PolygonStyle (Maybe Text) Source #

Color of the interior of the polygon in #RRGGBB format.

psStrokeColorStyler :: Lens' PolygonStyle (Maybe StyleFunction) Source #

Column-value, gradient or buckets styler that is used to determine the border color and opacity.

psStrokeWeight :: Lens' PolygonStyle (Maybe Int32) Source #

Width of the polyon border in pixels.

psStrokeOpacity :: Lens' PolygonStyle (Maybe Double) Source #

Opacity of the polygon border: 0.0 (transparent) to 1.0 (opaque).

psFillOpacity :: Lens' PolygonStyle (Maybe Double) Source #

Opacity of the interior of the polygon: 0.0 (transparent) to 1.0 (opaque).

psStrokeWeightStyler :: Lens' PolygonStyle (Maybe StyleFunction) Source #

Column-value or bucket styler that is used to determine the width of the polygon border.

psStrokeColor :: Lens' PolygonStyle (Maybe Text) Source #

Color of the polygon border in #RRGGBB format.

StyleFunctionGradient

data StyleFunctionGradient Source #

Gradient function that interpolates a range of colors based on column value.

See: styleFunctionGradient smart constructor.

Instances

Eq StyleFunctionGradient Source # 
Data StyleFunctionGradient Source # 

Methods

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

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

toConstr :: StyleFunctionGradient -> Constr #

dataTypeOf :: StyleFunctionGradient -> DataType #

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

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

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

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

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

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

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

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

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

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

Show StyleFunctionGradient Source # 
Generic StyleFunctionGradient Source # 
ToJSON StyleFunctionGradient Source # 
FromJSON StyleFunctionGradient Source # 
type Rep StyleFunctionGradient Source # 
type Rep StyleFunctionGradient = D1 (MetaData "StyleFunctionGradient" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "StyleFunctionGradient'" PrefixI True) ((:*:) (S1 (MetaSel (Just Symbol "_sfgMax") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) ((:*:) (S1 (MetaSel (Just Symbol "_sfgMin") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) (S1 (MetaSel (Just Symbol "_sfgColors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [StyleFunctionGradientColorsItem]))))))

styleFunctionGradient :: StyleFunctionGradient Source #

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

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

sfgMax :: Lens' StyleFunctionGradient (Maybe Double) Source #

Higher-end of the interpolation range: rows with this value will be assigned to colors[n-1].

sfgMin :: Lens' StyleFunctionGradient (Maybe Double) Source #

Lower-end of the interpolation range: rows with this value will be assigned to colors[0].

Column

data Column Source #

Specifies the details of a column in a table.

See: column smart constructor.

Instances

Eq Column Source # 

Methods

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

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

Data Column Source # 

Methods

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

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

toConstr :: Column -> Constr #

dataTypeOf :: Column -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Column Source # 
Generic Column Source # 

Associated Types

type Rep Column :: * -> * #

Methods

from :: Column -> Rep Column x #

to :: Rep Column x -> Column #

ToJSON Column Source # 
FromJSON Column Source # 
type Rep Column Source # 
type Rep Column = D1 (MetaData "Column" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Column'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_cColumnJSONSchema") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_cGraphPredicate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_cKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_cBaseColumn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ColumnBaseColumn))) ((:*:) (S1 (MetaSel (Just Symbol "_cColumnPropertiesJSON") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_cName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_cType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_cFormatPattern") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_cColumnId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))) ((:*:) (S1 (MetaSel (Just Symbol "_cValidValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) ((:*:) (S1 (MetaSel (Just Symbol "_cValidateData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) (S1 (MetaSel (Just Symbol "_cDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

column :: Column Source #

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

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

cColumnJSONSchema :: Lens' Column (Maybe Text) Source #

JSON schema for interpreting JSON in this column.

cGraphPredicate :: Lens' Column (Maybe Text) Source #

Column graph predicate. Used to map table to graph data model (subject,predicate,object) See W3C Graph-based Data Model.

cKind :: Lens' Column Text Source #

The kind of item this is. For a column, this is always fusiontables#column.

cBaseColumn :: Lens' Column (Maybe ColumnBaseColumn) Source #

Identifier of the base column. If present, this column is derived from the specified base column.

cColumnPropertiesJSON :: Lens' Column (Maybe Text) Source #

JSON object containing custom column properties.

cName :: Lens' Column (Maybe Text) Source #

Name of the column.

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

Type of the column.

cFormatPattern :: Lens' Column (Maybe Text) Source #

Format pattern. Acceptable values are DT_DATE_MEDIUMe.g Dec 24, 2008 DT_DATE_SHORTfor example 12/24/08 DT_DATE_TIME_MEDIUMfor example Dec 24, 2008 8:30:45 PM DT_DATE_TIME_SHORTfor example 12/24/08 8:30 PM DT_DAY_MONTH_2_DIGIT_YEARfor example 24/12/08 DT_DAY_MONTH_2_DIGIT_YEAR_TIMEfor example 24/12/08 20:30 DT_DAY_MONTH_2_DIGIT_YEAR_TIME_MERIDIANfor example 24/12/08 8:30 PM DT_DAY_MONTH_4_DIGIT_YEARfor example 24/12/2008 DT_DAY_MONTH_4_DIGIT_YEAR_TIMEfor example 24/12/2008 20:30 DT_DAY_MONTH_4_DIGIT_YEAR_TIME_MERIDIANfor example 24/12/2008 8:30 PM DT_ISO_YEAR_MONTH_DAYfor example 2008-12-24 DT_ISO_YEAR_MONTH_DAY_TIMEfor example 2008-12-24 20:30:45 DT_MONTH_DAY_4_DIGIT_YEARfor example 12/24/2008 DT_TIME_LONGfor example 8:30:45 PM UTC-6 DT_TIME_MEDIUMfor example 8:30:45 PM DT_TIME_SHORTfor example 8:30 PM DT_YEAR_ONLYfor example 2008 HIGHLIGHT_UNTYPED_CELLSHighlight cell data that does not match the data type NONENo formatting (default) NUMBER_CURRENCYfor example $1234.56 NUMBER_DEFAULTfor example 1,234.56 NUMBER_INTEGERfor example 1235 NUMBER_NO_SEPARATORfor example 1234.56 NUMBER_PERCENTfor example 123,456% NUMBER_SCIENTIFICfor example 1E3 STRING_EIGHT_LINE_IMAGEDisplays thumbnail images as tall as eight lines of text STRING_FOUR_LINE_IMAGEDisplays thumbnail images as tall as four lines of text STRING_JSON_TEXTAllows editing of text as JSON in UI STRING_JSON_LISTAllows editing of text as a JSON list in UI STRING_LINKTreats cell as a link (must start with http:// or https://) STRING_ONE_LINE_IMAGEDisplays thumbnail images as tall as one line of text STRING_VIDEO_OR_MAPDisplay a video or map thumbnail

cColumnId :: Lens' Column (Maybe Int32) Source #

Identifier for the column.

cValidValues :: Lens' Column [Text] Source #

List of valid values used to validate data and supply a drop-down list of values in the web application.

cValidateData :: Lens' Column (Maybe Bool) Source #

If true, data entered via the web application is validated.

cDescription :: Lens' Column (Maybe Text) Source #

Column description.

Table

data Table Source #

Represents a table.

See: table smart constructor.

Instances

Eq Table Source # 

Methods

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

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

Data Table Source # 

Methods

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

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

toConstr :: Table -> Constr #

dataTypeOf :: Table -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Table Source # 

Methods

showsPrec :: Int -> Table -> ShowS #

show :: Table -> String #

showList :: [Table] -> ShowS #

Generic Table Source # 

Associated Types

type Rep Table :: * -> * #

Methods

from :: Table -> Rep Table x #

to :: Rep Table x -> Table #

ToJSON Table Source # 
FromJSON Table Source # 
type Rep Table Source # 
type Rep Table = D1 (MetaData "Table" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "Table'" PrefixI True) ((:*:) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tabaIsExportable") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) ((:*:) (S1 (MetaSel (Just Symbol "_tabaKind") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 Text)) (S1 (MetaSel (Just Symbol "_tabaColumnPropertiesJSONSchema") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) (S1 (MetaSel (Just Symbol "_tabaTablePropertiesJSONSchema") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) ((:*:) (S1 (MetaSel (Just Symbol "_tabaName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tabaTablePropertiesJSON") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tabaColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Column]))) ((:*:) (S1 (MetaSel (Just Symbol "_tabaBaseTableIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) (S1 (MetaSel (Just Symbol "_tabaTableId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_tabaSQL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tabaDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) ((:*:) (S1 (MetaSel (Just Symbol "_tabaAttribution") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) (S1 (MetaSel (Just Symbol "_tabaAttributionLink") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))))

tabaIsExportable :: Lens' Table (Maybe Bool) Source #

Variable for whether table is exportable.

tabaKind :: Lens' Table Text Source #

The kind of item this is. For a table, this is always fusiontables#table.

tabaColumnPropertiesJSONSchema :: Lens' Table (Maybe Text) Source #

Default JSON schema for validating all JSON column properties.

tabaTablePropertiesJSONSchema :: Lens' Table (Maybe Text) Source #

JSON schema for validating the JSON table properties.

tabaName :: Lens' Table (Maybe Text) Source #

Name assigned to a table.

tabaTablePropertiesJSON :: Lens' Table (Maybe Text) Source #

JSON object containing custom table properties.

tabaColumns :: Lens' Table [Column] Source #

Columns in the table.

tabaBaseTableIds :: Lens' Table [Text] Source #

Base table identifier if this table is a view or merged table.

tabaTableId :: Lens' Table (Maybe Text) Source #

Encrypted unique alphanumeric identifier for the table.

tabaSQL :: Lens' Table (Maybe Text) Source #

SQL that encodes the table definition for derived tables.

tabaDescription :: Lens' Table (Maybe Text) Source #

Description assigned to the table.

tabaAttribution :: Lens' Table (Maybe Text) Source #

Attribution assigned to the table.

tabaAttributionLink :: Lens' Table (Maybe Text) Source #

Optional link for attribution.

LineStyle

data LineStyle Source #

Represents a LineStyle within a StyleSetting

See: lineStyle smart constructor.

Instances

Eq LineStyle Source # 
Data LineStyle Source # 

Methods

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

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

toConstr :: LineStyle -> Constr #

dataTypeOf :: LineStyle -> DataType #

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

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

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

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

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

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

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

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

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

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

Show LineStyle Source # 
Generic LineStyle Source # 

Associated Types

type Rep LineStyle :: * -> * #

ToJSON LineStyle Source # 
FromJSON LineStyle Source # 
type Rep LineStyle Source # 
type Rep LineStyle = D1 (MetaData "LineStyle" "Network.Google.FusionTables.Types.Product" "gogol-fusiontables-0.3.0-ESl5hmDbwFz97NzJeoZzZf" False) (C1 (MetaCons "LineStyle'" PrefixI True) ((:*:) ((:*:) (S1 (MetaSel (Just Symbol "_lsStrokeColorStyler") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StyleFunction))) (S1 (MetaSel (Just Symbol "_lsStrokeWeight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) ((:*:) (S1 (MetaSel (Just Symbol "_lsStrokeOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) ((:*:) (S1 (MetaSel (Just Symbol "_lsStrokeWeightStyler") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe StyleFunction))) (S1 (MetaSel (Just Symbol "_lsStrokeColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))))

lineStyle :: LineStyle Source #

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

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

lsStrokeColorStyler :: Lens' LineStyle (Maybe StyleFunction) Source #

Column-value, gradient or buckets styler that is used to determine the line color and opacity.

lsStrokeWeight :: Lens' LineStyle (Maybe Int32) Source #

Width of the line in pixels.

lsStrokeOpacity :: Lens' LineStyle (Maybe Double) Source #

Opacity of the line : 0.0 (transparent) to 1.0 (opaque).

lsStrokeWeightStyler :: Lens' LineStyle (Maybe StyleFunction) Source #

Column-value or bucket styler that is used to determine the width of the line.

lsStrokeColor :: Lens' LineStyle (Maybe Text) Source #

Color of the line in #RRGGBB format.