gogol-sheets-0.4.0: Google Sheets 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.Sheets

Contents

Description

Reads and writes Google Sheets.

See: Google Sheets API Reference

Synopsis

Service Configuration

sheetsService :: ServiceConfig Source #

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

OAuth Scopes

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

View your Google Spreadsheets

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

See and download all your Google Drive files

driveScope :: Proxy '["https://www.googleapis.com/auth/drive"] Source #

See, edit, create, and delete all of your Google Drive files

driveFileScope :: Proxy '["https://www.googleapis.com/auth/drive.file"] Source #

View and manage Google Drive files and folders that you have opened or created with this app

spreadsheetsScope :: Proxy '["https://www.googleapis.com/auth/spreadsheets"] Source #

See, edit, create, and delete your spreadsheets in Google Drive

API Declaration

Resources

sheets.spreadsheets.batchUpdate

sheets.spreadsheets.create

sheets.spreadsheets.developerMetadata.get

sheets.spreadsheets.developerMetadata.search

sheets.spreadsheets.get

sheets.spreadsheets.getByDataFilter

sheets.spreadsheets.sheets.copyTo

sheets.spreadsheets.values.append

sheets.spreadsheets.values.batchClear

sheets.spreadsheets.values.batchClearByDataFilter

sheets.spreadsheets.values.batchGet

sheets.spreadsheets.values.batchGetByDataFilter

sheets.spreadsheets.values.batchUpdate

sheets.spreadsheets.values.batchUpdateByDataFilter

sheets.spreadsheets.values.clear

sheets.spreadsheets.values.get

sheets.spreadsheets.values.update

Types

BasicChartSpecStackedType

data BasicChartSpecStackedType Source #

The stacked type for charts that support vertical stacking. Applies to Area, Bar, Column, Combo, and Stepped Area charts.

Constructors

BasicChartStackedTypeUnspecified

BASIC_CHART_STACKED_TYPE_UNSPECIFIED Default value, do not use.

NotStacked

NOT_STACKED Series are not stacked.

Stacked

STACKED Series values are stacked, each value is rendered vertically beginning from the top of the value below it.

PercentStacked

PERCENT_STACKED Vertical stacks are stretched to reach the top of the chart, with values laid out as percentages of each other.

Instances
Enum BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BasicChartSpecStackedType -> Constr #

dataTypeOf :: BasicChartSpecStackedType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSpecStackedType :: Type -> Type #

Hashable BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecStackedType = D1 (MetaData "BasicChartSpecStackedType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "BasicChartStackedTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotStacked" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Stacked" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PercentStacked" PrefixI False) (U1 :: Type -> Type)))

PivotGroupSortValueBucket

data PivotGroupSortValueBucket Source #

Information about which values in a pivot group should be used for sorting.

See: pivotGroupSortValueBucket smart constructor.

Instances
Eq PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: PivotGroupSortValueBucket -> Constr #

dataTypeOf :: PivotGroupSortValueBucket -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotGroupSortValueBucket :: Type -> Type #

ToJSON PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupSortValueBucket Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupSortValueBucket = D1 (MetaData "PivotGroupSortValueBucket" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PivotGroupSortValueBucket'" PrefixI True) (S1 (MetaSel (Just "_pgsvbBuckets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ExtendedValue])) :*: S1 (MetaSel (Just "_pgsvbValuesIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

pivotGroupSortValueBucket :: PivotGroupSortValueBucket Source #

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

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

pgsvbBuckets :: Lens' PivotGroupSortValueBucket [ExtendedValue] Source #

Determines the bucket from which values are chosen to sort. For example, in a pivot table with one row group & two column groups, the row group can list up to two values. The first value corresponds to a value within the first column group, and the second value corresponds to a value in the second column group. If no values are listed, this would indicate that the row should be sorted according to the "Grand Total" over the column groups. If a single value is listed, this would correspond to using the "Total" of that bucket.

pgsvbValuesIndex :: Lens' PivotGroupSortValueBucket (Maybe Int32) Source #

The offset in the PivotTable.values list which the values in this grouping should be sorted by.

ValueRange

data ValueRange Source #

Data within a range of the spreadsheet.

See: valueRange smart constructor.

Instances
Eq ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: ValueRange -> Constr #

dataTypeOf :: ValueRange -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ValueRange :: Type -> Type #

ToJSON ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ValueRange = D1 (MetaData "ValueRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ValueRange'" PrefixI True) (S1 (MetaSel (Just "_vrValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [[JSONValue]])) :*: (S1 (MetaSel (Just "_vrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_vrMajorDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ValueRangeMajorDimension)))))

valueRange :: ValueRange Source #

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

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

vrValues :: Lens' ValueRange [[JSONValue]] Source #

The data that was read or to be written. This is an array of arrays, the outer array representing all the data and each inner array representing a major dimension. Each item in the inner array corresponds with one cell. For output, empty trailing rows and columns will not be included. For input, supported value types are: bool, string, and double. Null values will be skipped. To set a cell to an empty value, set the string value to an empty string.

vrRange :: Lens' ValueRange (Maybe Text) Source #

The range the values cover, in A1 notation. For output, this range indicates the entire requested range, even though the values will exclude trailing rows and columns. When appending values, this field represents the range to search for a table, after which values will be appended.

vrMajorDimension :: Lens' ValueRange (Maybe ValueRangeMajorDimension) Source #

The major dimension of the values. For output, if the spreadsheet data is: `A1=1,B1=2,A2=3,B2=4`, then requesting `range=A1:B2,majorDimension=ROWS` will return `[[1,2],[3,4]]`, whereas requesting `range=A1:B2,majorDimension=COLUMNS` will return `[[1,3],[2,4]]`. For input, with `range=A1:B2,majorDimension=ROWS` then `[[1,2],[3,4]]` will set `A1=1,B1=2,A2=3,B2=4`. With `range=A1:B2,majorDimension=COLUMNS` then `[[1,2],[3,4]]` will set `A1=1,B1=3,A2=2,B2=4`. When writing, if this field is not set, it defaults to ROWS.

SortRangeRequest

data SortRangeRequest Source #

Sorts data in rows based on a sort order per column.

See: sortRangeRequest smart constructor.

Instances
Eq SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: SortRangeRequest -> Constr #

dataTypeOf :: SortRangeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SortRangeRequest :: Type -> Type #

ToJSON SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SortRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SortRangeRequest = D1 (MetaData "SortRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SortRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_srrSortSpecs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [SortSpec])) :*: S1 (MetaSel (Just "_srrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))))

sortRangeRequest :: SortRangeRequest Source #

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

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

srrSortSpecs :: Lens' SortRangeRequest [SortSpec] Source #

The sort order per column. Later specifications are used when values are equal in the earlier specifications.

CopyPasteRequestPasteType

data CopyPasteRequestPasteType Source #

What kind of data to paste.

Constructors

PasteNormal

PASTE_NORMAL Paste values, formulas, formats, and merges.

PasteValues

PASTE_VALUES Paste the values ONLY without formats, formulas, or merges.

PasteFormat

PASTE_FORMAT Paste the format and data validation only.

PasteNoBOrders

PASTE_NO_BORDERS Like PASTE_NORMAL but without borders.

PasteFormula

PASTE_FORMULA Paste the formulas only.

PasteDataValidation

PASTE_DATA_VALIDATION Paste the data validation only.

PasteConditionalFormatting

PASTE_CONDITIONAL_FORMATTING Paste the conditional formatting rules only.

Instances
Enum CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: CopyPasteRequestPasteType -> Constr #

dataTypeOf :: CopyPasteRequestPasteType -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CopyPasteRequestPasteType :: Type -> Type #

Hashable CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CopyPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CopyPasteRequestPasteType = D1 (MetaData "CopyPasteRequestPasteType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "PasteNormal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PasteValues" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PasteFormat" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PasteNoBOrders" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PasteFormula" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PasteDataValidation" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PasteConditionalFormatting" PrefixI False) (U1 :: Type -> Type))))

DeveloperMetadataLookupLocationMatchingStrategy

data DeveloperMetadataLookupLocationMatchingStrategy Source #

Determines how this lookup matches the location. If this field is specified as EXACT, only developer metadata associated on the exact location specified is matched. If this field is specified to INTERSECTING, developer metadata associated on intersecting locations is also matched. If left unspecified, this field assumes a default value of INTERSECTING. If this field is specified, a metadataLocation must also be specified.

Constructors

DeveloperMetadataLocationMatchingStrategyUnspecified

DEVELOPER_METADATA_LOCATION_MATCHING_STRATEGY_UNSPECIFIED Default value. This value must not be used.

ExactLocation

EXACT_LOCATION Indicates that a specified location should be matched exactly. For example, if row three were specified as a location this matching strategy would only match developer metadata also associated on row three. Metadata associated on other locations would not be considered.

IntersectingLocation

INTERSECTING_LOCATION Indicates that a specified location should match that exact location as well as any intersecting locations. For example, if row three were specified as a location this matching strategy would match developer metadata associated on row three as well as metadata associated on locations that intersect row three. If, for instance, there was developer metadata associated on column B, this matching strategy would also match that location because column B intersects row three.

Instances
Enum DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: DeveloperMetadataLookupLocationMatchingStrategy -> Constr #

dataTypeOf :: DeveloperMetadataLookupLocationMatchingStrategy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupLocationMatchingStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupLocationMatchingStrategy = D1 (MetaData "DeveloperMetadataLookupLocationMatchingStrategy" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeveloperMetadataLocationMatchingStrategyUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ExactLocation" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IntersectingLocation" PrefixI False) (U1 :: Type -> Type)))

BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption

data BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source #

Determines how dates, times, and durations in the response should be rendered. This is ignored if response_value_render_option is FORMATTED_VALUE. The default dateTime render option is DateTimeRenderOption.SERIAL_NUMBER.

Constructors

SerialNumber

SERIAL_NUMBER Instructs date, time, datetime, and duration fields to be output as doubles in "serial number" format, as popularized by Lotus 1-2-3. The whole number portion of the value (left of the decimal) counts the days since December 30th 1899. The fractional portion (right of the decimal) counts the time as a fraction of the day. For example, January 1st 1900 at noon would be 2.5, 2 because it's 2 days after December 30st 1899, and .5 because noon is half a day. February 1st 1900 at 3pm would be 33.625. This correctly treats the year 1900 as not a leap year.

FormattedString

FORMATTED_STRING Instructs date, time, datetime, and duration fields to be output as strings in their given number format (which is dependent on the spreadsheet locale).

Instances
Enum BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption -> Constr #

dataTypeOf :: BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption = D1 (MetaData "BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SerialNumber" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "FormattedString" PrefixI False) (U1 :: Type -> Type))

DeleteNamedRangeRequest

data DeleteNamedRangeRequest Source #

Removes the named range with the given ID from the spreadsheet.

See: deleteNamedRangeRequest smart constructor.

Instances
Eq DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DeleteNamedRangeRequest -> Constr #

dataTypeOf :: DeleteNamedRangeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteNamedRangeRequest :: Type -> Type #

ToJSON DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteNamedRangeRequest = D1 (MetaData "DeleteNamedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteNamedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_dnrrNamedRangeId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

deleteNamedRangeRequest :: DeleteNamedRangeRequest Source #

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

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

dnrrNamedRangeId :: Lens' DeleteNamedRangeRequest (Maybe Text) Source #

The ID of the named range to delete.

UpdateNamedRangeRequest

data UpdateNamedRangeRequest Source #

Updates properties of the named range with the specified namedRangeId.

See: updateNamedRangeRequest smart constructor.

Instances
Eq UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: UpdateNamedRangeRequest -> Constr #

dataTypeOf :: UpdateNamedRangeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateNamedRangeRequest :: Type -> Type #

ToJSON UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateNamedRangeRequest = D1 (MetaData "UpdateNamedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateNamedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_unrrNamedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NamedRange)) :*: S1 (MetaSel (Just "_unrrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask))))

updateNamedRangeRequest :: UpdateNamedRangeRequest Source #

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

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

unrrNamedRange :: Lens' UpdateNamedRangeRequest (Maybe NamedRange) Source #

The named range to update with the new properties.

unrrFields :: Lens' UpdateNamedRangeRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `namedRange` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

BasicChartAxisPosition

data BasicChartAxisPosition Source #

The position of this axis.

Constructors

BasicChartAxisPositionUnspecified

BASIC_CHART_AXIS_POSITION_UNSPECIFIED Default value, do not use.

BottomAxis

BOTTOM_AXIS The axis rendered at the bottom of a chart. For most charts, this is the standard major axis. For bar charts, this is a minor axis.

LeftAxis

LEFT_AXIS The axis rendered at the left of a chart. For most charts, this is a minor axis. For bar charts, this is the standard major axis.

RightAxis

RIGHT_AXIS The axis rendered at the right of a chart. For most charts, this is a minor axis. For bar charts, this is an unusual major axis.

Instances
Enum BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BasicChartAxisPosition -> Constr #

dataTypeOf :: BasicChartAxisPosition -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartAxisPosition :: Type -> Type #

Hashable BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartAxisPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartAxisPosition = D1 (MetaData "BasicChartAxisPosition" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "BasicChartAxisPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BottomAxis" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "LeftAxis" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RightAxis" PrefixI False) (U1 :: Type -> Type)))

ChartData

data ChartData Source #

The data included in a domain or series.

See: chartData smart constructor.

Instances
Eq ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: ChartData -> Constr #

dataTypeOf :: ChartData -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ChartData :: Type -> Type #

ToJSON ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartData = D1 (MetaData "ChartData" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "ChartData'" PrefixI True) (S1 (MetaSel (Just "_cdSourceRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ChartSourceRange))))

chartData :: ChartData Source #

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

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

cdSourceRange :: Lens' ChartData (Maybe ChartSourceRange) Source #

The source ranges of the data.

BatchClearValuesRequest

data BatchClearValuesRequest Source #

The request for clearing more than one range of values in a spreadsheet.

See: batchClearValuesRequest smart constructor.

Instances
Eq BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BatchClearValuesRequest -> Constr #

dataTypeOf :: BatchClearValuesRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchClearValuesRequest :: Type -> Type #

ToJSON BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesRequest = D1 (MetaData "BatchClearValuesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "BatchClearValuesRequest'" PrefixI True) (S1 (MetaSel (Just "_bcvrRanges") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

batchClearValuesRequest :: BatchClearValuesRequest Source #

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

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

bcvrRanges :: Lens' BatchClearValuesRequest [Text] Source #

The ranges to clear, in A1 notation.

CreateDeveloperMetadataResponse

data CreateDeveloperMetadataResponse Source #

The response from creating developer metadata.

See: createDeveloperMetadataResponse smart constructor.

Instances
Eq CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: CreateDeveloperMetadataResponse -> Constr #

dataTypeOf :: CreateDeveloperMetadataResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CreateDeveloperMetadataResponse :: Type -> Type #

ToJSON CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CreateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CreateDeveloperMetadataResponse = D1 (MetaData "CreateDeveloperMetadataResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "CreateDeveloperMetadataResponse'" PrefixI True) (S1 (MetaSel (Just "_cdmrDeveloperMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeveloperMetadata))))

createDeveloperMetadataResponse :: CreateDeveloperMetadataResponse Source #

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

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

DateTimeRule

data DateTimeRule Source #

Instances
Eq DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DateTimeRule -> Constr #

dataTypeOf :: DateTimeRule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DateTimeRule :: Type -> Type #

ToJSON DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DateTimeRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DateTimeRule = D1 (MetaData "DateTimeRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DateTimeRule'" PrefixI True) (S1 (MetaSel (Just "_dtrType") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DateTimeRuleType))))

dateTimeRule :: DateTimeRule Source #

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

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

dtrType :: Lens' DateTimeRule (Maybe DateTimeRuleType) Source #

The type of date-time grouping to apply.

DeleteRangeRequestShiftDimension

data DeleteRangeRequestShiftDimension Source #

The dimension from which deleted cells will be replaced with. If ROWS, existing cells will be shifted upward to replace the deleted cells. If COLUMNS, existing cells will be shifted left to replace the deleted cells.

Constructors

DimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

Rows

ROWS Operates on the rows of a sheet.

Columns

COLUMNS Operates on the columns of a sheet.

Instances
Enum DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: DeleteRangeRequestShiftDimension -> Constr #

dataTypeOf :: DeleteRangeRequestShiftDimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DeleteRangeRequestShiftDimension :: Type -> Type #

Hashable DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeleteRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeleteRangeRequestShiftDimension = D1 (MetaData "DeleteRangeRequestShiftDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Rows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Columns" PrefixI False) (U1 :: Type -> Type)))

BasicChartSeriesTargetAxis

data BasicChartSeriesTargetAxis Source #

The minor axis that will specify the range of values for this series. For example, if charting stocks over time, the "Volume" series may want to be pinned to the right with the prices pinned to the left, because the scale of trading volume is different than the scale of prices. It is an error to specify an axis that isn't a valid minor axis for the chart's type.

Constructors

BCSTABasicChartAxisPositionUnspecified

BASIC_CHART_AXIS_POSITION_UNSPECIFIED Default value, do not use.

BCSTABottomAxis

BOTTOM_AXIS The axis rendered at the bottom of a chart. For most charts, this is the standard major axis. For bar charts, this is a minor axis.

BCSTALeftAxis

LEFT_AXIS The axis rendered at the left of a chart. For most charts, this is a minor axis. For bar charts, this is the standard major axis.

BCSTARightAxis

RIGHT_AXIS The axis rendered at the right of a chart. For most charts, this is a minor axis. For bar charts, this is an unusual major axis.

Instances
Enum BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BasicChartSeriesTargetAxis -> Constr #

dataTypeOf :: BasicChartSeriesTargetAxis -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSeriesTargetAxis :: Type -> Type #

Hashable BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSeriesTargetAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSeriesTargetAxis = D1 (MetaData "BasicChartSeriesTargetAxis" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "BCSTABasicChartAxisPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTABottomAxis" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BCSTALeftAxis" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTARightAxis" PrefixI False) (U1 :: Type -> Type)))

DataFilterValueRangeMajorDimension

data DataFilterValueRangeMajorDimension Source #

The major dimension of the values.

Constructors

DFVRMDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

DFVRMDRows

ROWS Operates on the rows of a sheet.

DFVRMDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: DataFilterValueRangeMajorDimension -> Constr #

dataTypeOf :: DataFilterValueRangeMajorDimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DataFilterValueRangeMajorDimension :: Type -> Type #

Hashable DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DataFilterValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DataFilterValueRangeMajorDimension = D1 (MetaData "DataFilterValueRangeMajorDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DFVRMDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DFVRMDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DFVRMDColumns" PrefixI False) (U1 :: Type -> Type)))

SpreadsheetProperties

data SpreadsheetProperties Source #

Properties of a spreadsheet.

See: spreadsheetProperties smart constructor.

Instances
Eq SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: SpreadsheetProperties -> Constr #

dataTypeOf :: SpreadsheetProperties -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SpreadsheetProperties :: Type -> Type #

ToJSON SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SpreadsheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SpreadsheetProperties = D1 (MetaData "SpreadsheetProperties" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SpreadsheetProperties'" PrefixI True) ((S1 (MetaSel (Just "_spDefaultFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormat)) :*: (S1 (MetaSel (Just "_spLocale") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_spIterativeCalculationSettings") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe IterativeCalculationSettings)))) :*: (S1 (MetaSel (Just "_spAutoRecalc") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SpreadsheetPropertiesAutoRecalc)) :*: (S1 (MetaSel (Just "_spTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_spTimeZone") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

spreadsheetProperties :: SpreadsheetProperties Source #

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

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

spDefaultFormat :: Lens' SpreadsheetProperties (Maybe CellFormat) Source #

The default format of all cells in the spreadsheet. CellData.effectiveFormat will not be set if the cell's format is equal to this default format. This field is read-only.

spLocale :: Lens' SpreadsheetProperties (Maybe Text) Source #

The locale of the spreadsheet in one of the following formats: * an ISO 639-1 language code such as `en` * an ISO 639-2 language code such as `fil`, if no 639-1 code exists * a combination of the ISO language code and country code, such as `en_US` Note: when updating this field, not all locales/languages are supported.

spIterativeCalculationSettings :: Lens' SpreadsheetProperties (Maybe IterativeCalculationSettings) Source #

Determines whether and how circular references are resolved with iterative calculation. Absence of this field means that circular references will result in calculation errors.

spAutoRecalc :: Lens' SpreadsheetProperties (Maybe SpreadsheetPropertiesAutoRecalc) Source #

The amount of time to wait before volatile functions are recalculated.

spTitle :: Lens' SpreadsheetProperties (Maybe Text) Source #

The title of the spreadsheet.

spTimeZone :: Lens' SpreadsheetProperties (Maybe Text) Source #

The time zone of the spreadsheet, in CLDR format such as `America/New_York`. If the time zone isn't recognized, this may be a custom time zone such as `GMT-07:00`.

BOrders

data BOrders Source #

The borders of the cell.

See: bOrders smart constructor.

Instances
Eq BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

Data BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BOrders -> Constr #

dataTypeOf :: BOrders -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BOrders :: Type -> Type #

Methods

from :: BOrders -> Rep BOrders x #

to :: Rep BOrders x -> BOrders #

ToJSON BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BOrders Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BOrders = D1 (MetaData "BOrders" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BOrders'" PrefixI True) ((S1 (MetaSel (Just "_boBottom") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: S1 (MetaSel (Just "_boLeft") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder))) :*: (S1 (MetaSel (Just "_boRight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: S1 (MetaSel (Just "_boTop") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)))))

bOrders :: BOrders Source #

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

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

boBottom :: Lens' BOrders (Maybe BOrder) Source #

The bottom border of the cell.

boLeft :: Lens' BOrders (Maybe BOrder) Source #

The left border of the cell.

boRight :: Lens' BOrders (Maybe BOrder) Source #

The right border of the cell.

boTop :: Lens' BOrders (Maybe BOrder) Source #

The top border of the cell.

BatchClearValuesByDataFilterRequest

data BatchClearValuesByDataFilterRequest Source #

The request for clearing more than one range selected by a DataFilter in a spreadsheet.

See: batchClearValuesByDataFilterRequest smart constructor.

Instances
Eq BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BatchClearValuesByDataFilterRequest -> Constr #

dataTypeOf :: BatchClearValuesByDataFilterRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesByDataFilterRequest = D1 (MetaData "BatchClearValuesByDataFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "BatchClearValuesByDataFilterRequest'" PrefixI True) (S1 (MetaSel (Just "_bcvbdfrDataFilters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DataFilter]))))

batchClearValuesByDataFilterRequest :: BatchClearValuesByDataFilterRequest Source #

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

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

bcvbdfrDataFilters :: Lens' BatchClearValuesByDataFilterRequest [DataFilter] Source #

The DataFilters used to determine which ranges to clear.

TextFormatRun

data TextFormatRun Source #

A run of a text format. The format of this run continues until the start index of the next run. When updating, all fields must be set.

See: textFormatRun smart constructor.

Instances
Eq TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: TextFormatRun -> Constr #

dataTypeOf :: TextFormatRun -> DataType #

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

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

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

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

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

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

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

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

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

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

Show TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TextFormatRun :: Type -> Type #

ToJSON TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextFormatRun Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextFormatRun = D1 (MetaData "TextFormatRun" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TextFormatRun'" PrefixI True) (S1 (MetaSel (Just "_tfrFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: S1 (MetaSel (Just "_tfrStartIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

textFormatRun :: TextFormatRun Source #

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

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

tfrFormat :: Lens' TextFormatRun (Maybe TextFormat) Source #

The format of this run. Absent values inherit the cell's format.

tfrStartIndex :: Lens' TextFormatRun (Maybe Int32) Source #

The character index where this run starts.

DeleteDimensionGroupRequest

data DeleteDimensionGroupRequest Source #

Deletes a group over the specified range by decrementing the depth of the dimensions in the range. For example, assume the sheet has a depth-1 group over B:E and a depth-2 group over C:D. Deleting a group over D:E leaves the sheet with a depth-1 group over B:D and a depth-2 group over C:C.

See: deleteDimensionGroupRequest smart constructor.

Instances
Eq DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DeleteDimensionGroupRequest -> Constr #

dataTypeOf :: DeleteDimensionGroupRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteDimensionGroupRequest :: Type -> Type #

ToJSON DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionGroupRequest = D1 (MetaData "DeleteDimensionGroupRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteDimensionGroupRequest'" PrefixI True) (S1 (MetaSel (Just "_ddgrRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DimensionRange))))

deleteDimensionGroupRequest :: DeleteDimensionGroupRequest Source #

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

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

ddgrRange :: Lens' DeleteDimensionGroupRequest (Maybe DimensionRange) Source #

The range of the group to be deleted.

UpdateDimensionGroupRequest

data UpdateDimensionGroupRequest Source #

Updates the state of the specified group.

See: updateDimensionGroupRequest smart constructor.

Instances
Eq UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: UpdateDimensionGroupRequest -> Constr #

dataTypeOf :: UpdateDimensionGroupRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateDimensionGroupRequest :: Type -> Type #

ToJSON UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDimensionGroupRequest = D1 (MetaData "UpdateDimensionGroupRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateDimensionGroupRequest'" PrefixI True) (S1 (MetaSel (Just "_udgrDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionGroup)) :*: S1 (MetaSel (Just "_udgrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask))))

updateDimensionGroupRequest :: UpdateDimensionGroupRequest Source #

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

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

udgrDimensionGroup :: Lens' UpdateDimensionGroupRequest (Maybe DimensionGroup) Source #

The group whose state should be updated. The range and depth of the group should specify a valid group on the sheet, and all other fields updated.

udgrFields :: Lens' UpdateDimensionGroupRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `dimensionGroup` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

BubbleChartSpecLegendPosition

data BubbleChartSpecLegendPosition Source #

Where the legend of the chart should be drawn.

Constructors

BubbleChartLegendPositionUnspecified

BUBBLE_CHART_LEGEND_POSITION_UNSPECIFIED Default value, do not use.

BottomLegend

BOTTOM_LEGEND The legend is rendered on the bottom of the chart.

LeftLegend

LEFT_LEGEND The legend is rendered on the left of the chart.

RightLegend

RIGHT_LEGEND The legend is rendered on the right of the chart.

TopLegend

TOP_LEGEND The legend is rendered on the top of the chart.

NoLegend

NO_LEGEND No legend is rendered.

InsideLegend

INSIDE_LEGEND The legend is rendered inside the chart area.

Instances
Enum BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BubbleChartSpecLegendPosition -> Constr #

dataTypeOf :: BubbleChartSpecLegendPosition -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BubbleChartSpecLegendPosition :: Type -> Type #

Hashable BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BubbleChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BubbleChartSpecLegendPosition = D1 (MetaData "BubbleChartSpecLegendPosition" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "BubbleChartLegendPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BottomLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LeftLegend" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "RightLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TopLegend" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NoLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "InsideLegend" PrefixI False) (U1 :: Type -> Type))))

AddSheetRequest

data AddSheetRequest Source #

Adds a new sheet. When a sheet is added at a given index, all subsequent sheets' indexes are incremented. To add an object sheet, use AddChartRequest instead and specify EmbeddedObjectPosition.sheetId or EmbeddedObjectPosition.newSheet.

See: addSheetRequest smart constructor.

Instances
Eq AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AddSheetRequest -> Constr #

dataTypeOf :: AddSheetRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddSheetRequest :: Type -> Type #

ToJSON AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddSheetRequest = D1 (MetaData "AddSheetRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddSheetRequest'" PrefixI True) (S1 (MetaSel (Just "_asrProperties") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SheetProperties))))

addSheetRequest :: AddSheetRequest Source #

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

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

asrProperties :: Lens' AddSheetRequest (Maybe SheetProperties) Source #

The properties the new sheet should have. All properties are optional. The sheetId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a sheet that already exists.)

SortSpec

data SortSpec Source #

A sort order associated with a specific column or row.

See: sortSpec smart constructor.

Instances
Eq SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: SortSpec -> Constr #

dataTypeOf :: SortSpec -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SortSpec :: Type -> Type #

Methods

from :: SortSpec -> Rep SortSpec x #

to :: Rep SortSpec x -> SortSpec #

ToJSON SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SortSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SortSpec = D1 (MetaData "SortSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SortSpec'" PrefixI True) (S1 (MetaSel (Just "_ssSortOrder") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SortSpecSortOrder)) :*: S1 (MetaSel (Just "_ssDimensionIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

sortSpec :: SortSpec Source #

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

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

ssSortOrder :: Lens' SortSpec (Maybe SortSpecSortOrder) Source #

The order data should be sorted.

ssDimensionIndex :: Lens' SortSpec (Maybe Int32) Source #

The dimension the sort should be applied to.

DimensionGroup

data DimensionGroup Source #

A group over an interval of rows or columns on a sheet, which can contain or be contained within other groups. A group can be collapsed or expanded as a unit on the sheet.

See: dimensionGroup smart constructor.

Instances
Eq DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DimensionGroup -> Constr #

dataTypeOf :: DimensionGroup -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DimensionGroup :: Type -> Type #

ToJSON DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionGroup = D1 (MetaData "DimensionGroup" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DimensionGroup'" PrefixI True) (S1 (MetaSel (Just "_dgCollapsed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_dgRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRange)) :*: S1 (MetaSel (Just "_dgDepth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

dimensionGroup :: DimensionGroup Source #

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

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

dgCollapsed :: Lens' DimensionGroup (Maybe Bool) Source #

This field is true if this group is collapsed. A collapsed group remains collapsed if an overlapping group at a shallower depth is expanded. A true value does not imply that all dimensions within the group are hidden, since a dimension's visibility can change independently from this group property. However, when this property is updated, all dimensions within it are set to hidden if this field is true, or set to visible if this field is false.

dgRange :: Lens' DimensionGroup (Maybe DimensionRange) Source #

The range over which this group exists.

dgDepth :: Lens' DimensionGroup (Maybe Int32) Source #

The depth of the group, representing how many groups have a range that wholly contains the range of this group.

BatchUpdateValuesRequestResponseDateTimeRenderOption

data BatchUpdateValuesRequestResponseDateTimeRenderOption Source #

Determines how dates, times, and durations in the response should be rendered. This is ignored if response_value_render_option is FORMATTED_VALUE. The default dateTime render option is DateTimeRenderOption.SERIAL_NUMBER.

Constructors

BUVRRDTROSerialNumber

SERIAL_NUMBER Instructs date, time, datetime, and duration fields to be output as doubles in "serial number" format, as popularized by Lotus 1-2-3. The whole number portion of the value (left of the decimal) counts the days since December 30th 1899. The fractional portion (right of the decimal) counts the time as a fraction of the day. For example, January 1st 1900 at noon would be 2.5, 2 because it's 2 days after December 30st 1899, and .5 because noon is half a day. February 1st 1900 at 3pm would be 33.625. This correctly treats the year 1900 as not a leap year.

BUVRRDTROFormattedString

FORMATTED_STRING Instructs date, time, datetime, and duration fields to be output as strings in their given number format (which is dependent on the spreadsheet locale).

Instances
Enum BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BatchUpdateValuesRequestResponseDateTimeRenderOption -> Constr #

dataTypeOf :: BatchUpdateValuesRequestResponseDateTimeRenderOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestResponseDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestResponseDateTimeRenderOption = D1 (MetaData "BatchUpdateValuesRequestResponseDateTimeRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BUVRRDTROSerialNumber" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BUVRRDTROFormattedString" PrefixI False) (U1 :: Type -> Type))

CopyPasteRequest

data CopyPasteRequest Source #

Copies data from the source to the destination.

See: copyPasteRequest smart constructor.

Instances
Eq CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: CopyPasteRequest -> Constr #

dataTypeOf :: CopyPasteRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CopyPasteRequest :: Type -> Type #

ToJSON CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CopyPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CopyPasteRequest = D1 (MetaData "CopyPasteRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CopyPasteRequest'" PrefixI True) ((S1 (MetaSel (Just "_cprDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_cprSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))) :*: (S1 (MetaSel (Just "_cprPasteOrientation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CopyPasteRequestPasteOrientation)) :*: S1 (MetaSel (Just "_cprPasteType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CopyPasteRequestPasteType)))))

copyPasteRequest :: CopyPasteRequest Source #

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

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

cprDestination :: Lens' CopyPasteRequest (Maybe GridRange) Source #

The location to paste to. If the range covers a span that's a multiple of the source's height or width, then the data will be repeated to fill in the destination range. If the range is smaller than the source range, the entire source data will still be copied (beyond the end of the destination range).

cprSource :: Lens' CopyPasteRequest (Maybe GridRange) Source #

The source range to copy.

cprPasteOrientation :: Lens' CopyPasteRequest (Maybe CopyPasteRequestPasteOrientation) Source #

How that data should be oriented when pasting.

GridRange

data GridRange Source #

A range on a sheet. All indexes are zero-based. Indexes are half open, e.g the start index is inclusive and the end index is exclusive -- [start_index, end_index). Missing indexes indicate the range is unbounded on that side. For example, if `"Sheet1"` is sheet ID 0, then: `Sheet1!A1:A1 == sheet_id: 0, start_row_index: 0, end_row_index: 1, start_column_index: 0, end_column_index: 1` `Sheet1!A3:B4 == sheet_id: 0, start_row_index: 2, end_row_index: 4, start_column_index: 0, end_column_index: 2` `Sheet1!A:B == sheet_id: 0, start_column_index: 0, end_column_index: 2` `Sheet1!A5:B == sheet_id: 0, start_row_index: 4, start_column_index: 0, end_column_index: 2` `Sheet1 == sheet_id:0` The start index must always be less than or equal to the end index. If the start index equals the end index, then the range is empty. Empty ranges are typically not meaningful and are usually rendered in the UI as `#REF!`.

See: gridRange smart constructor.

Instances
Eq GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: GridRange -> Constr #

dataTypeOf :: GridRange -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GridRange :: Type -> Type #

ToJSON GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridRange = D1 (MetaData "GridRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GridRange'" PrefixI True) ((S1 (MetaSel (Just "_grEndColumnIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_grStartColumnIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_grEndRowIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_grStartRowIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_grSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

gridRange :: GridRange Source #

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

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

grEndColumnIndex :: Lens' GridRange (Maybe Int32) Source #

The end column (exclusive) of the range, or not set if unbounded.

grStartColumnIndex :: Lens' GridRange (Maybe Int32) Source #

The start column (inclusive) of the range, or not set if unbounded.

grEndRowIndex :: Lens' GridRange (Maybe Int32) Source #

The end row (exclusive) of the range, or not set if unbounded.

grStartRowIndex :: Lens' GridRange (Maybe Int32) Source #

The start row (inclusive) of the range, or not set if unbounded.

grSheetId :: Lens' GridRange (Maybe Int32) Source #

The sheet this range is on.

AppendDimensionRequestDimension

data AppendDimensionRequestDimension Source #

Whether rows or columns should be appended.

Constructors

ADRDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

ADRDRows

ROWS Operates on the rows of a sheet.

ADRDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: AppendDimensionRequestDimension -> Constr #

dataTypeOf :: AppendDimensionRequestDimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep AppendDimensionRequestDimension :: Type -> Type #

Hashable AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep AppendDimensionRequestDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep AppendDimensionRequestDimension = D1 (MetaData "AppendDimensionRequestDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ADRDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "ADRDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ADRDColumns" PrefixI False) (U1 :: Type -> Type)))

AddFilterViewResponse

data AddFilterViewResponse Source #

The result of adding a filter view.

See: addFilterViewResponse smart constructor.

Instances
Eq AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AddFilterViewResponse -> Constr #

dataTypeOf :: AddFilterViewResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddFilterViewResponse :: Type -> Type #

ToJSON AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddFilterViewResponse = D1 (MetaData "AddFilterViewResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddFilterViewResponse'" PrefixI True) (S1 (MetaSel (Just "_afvrFilter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe FilterView))))

addFilterViewResponse :: AddFilterViewResponse Source #

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

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

afvrFilter :: Lens' AddFilterViewResponse (Maybe FilterView) Source #

The newly added filter view.

DimensionRangeDimension

data DimensionRangeDimension Source #

The dimension of the span.

Constructors

DRDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

DRDRows

ROWS Operates on the rows of a sheet.

DRDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: DimensionRangeDimension -> Constr #

dataTypeOf :: DimensionRangeDimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DimensionRangeDimension :: Type -> Type #

Hashable DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DimensionRangeDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DimensionRangeDimension = D1 (MetaData "DimensionRangeDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DRDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DRDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DRDColumns" PrefixI False) (U1 :: Type -> Type)))

BooleanCondition

data BooleanCondition Source #

A condition that can evaluate to true or false. BooleanConditions are used by conditional formatting, data validation, and the criteria in filters.

See: booleanCondition smart constructor.

Instances
Eq BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BooleanCondition -> Constr #

dataTypeOf :: BooleanCondition -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BooleanCondition :: Type -> Type #

ToJSON BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BooleanCondition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BooleanCondition = D1 (MetaData "BooleanCondition" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BooleanCondition'" PrefixI True) (S1 (MetaSel (Just "_bcValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ConditionValue])) :*: S1 (MetaSel (Just "_bcType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BooleanConditionType))))

booleanCondition :: BooleanCondition Source #

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

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

bcValues :: Lens' BooleanCondition [ConditionValue] Source #

The values of the condition. The number of supported values depends on the condition type. Some support zero values, others one or two values, and ConditionType.ONE_OF_LIST supports an arbitrary number of values.

AutoResizeDimensionsRequest

data AutoResizeDimensionsRequest Source #

Automatically resizes one or more dimensions based on the contents of the cells in that dimension.

See: autoResizeDimensionsRequest smart constructor.

Instances
Eq AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AutoResizeDimensionsRequest -> Constr #

dataTypeOf :: AutoResizeDimensionsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AutoResizeDimensionsRequest :: Type -> Type #

ToJSON AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AutoResizeDimensionsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AutoResizeDimensionsRequest = D1 (MetaData "AutoResizeDimensionsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AutoResizeDimensionsRequest'" PrefixI True) (S1 (MetaSel (Just "_ardrDimensions") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DimensionRange))))

autoResizeDimensionsRequest :: AutoResizeDimensionsRequest Source #

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

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

ardrDimensions :: Lens' AutoResizeDimensionsRequest (Maybe DimensionRange) Source #

The dimensions to automatically resize.

BubbleChartSpec

data BubbleChartSpec Source #

A bubble chart.

See: bubbleChartSpec smart constructor.

Instances
Eq BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BubbleChartSpec -> Constr #

dataTypeOf :: BubbleChartSpec -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BubbleChartSpec :: Type -> Type #

ToJSON BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BubbleChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BubbleChartSpec = D1 (MetaData "BubbleChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BubbleChartSpec'" PrefixI True) (((S1 (MetaSel (Just "_bcsBubbleTextStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: S1 (MetaSel (Just "_bcsBubbleBOrderColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color))) :*: (S1 (MetaSel (Just "_bcsLegendPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BubbleChartSpecLegendPosition)) :*: (S1 (MetaSel (Just "_bcsDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_bcsSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))) :*: ((S1 (MetaSel (Just "_bcsBubbleLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: (S1 (MetaSel (Just "_bcsGroupIds") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_bcsBubbleMinRadiusSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) :*: (S1 (MetaSel (Just "_bcsBubbleMaxRadiusSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_bcsBubbleOpacity") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_bcsBubbleSizes") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)))))))

bcsBubbleTextStyle :: Lens' BubbleChartSpec (Maybe TextFormat) Source #

The format of the text inside the bubbles. Underline and Strikethrough are not supported.

bcsLegendPosition :: Lens' BubbleChartSpec (Maybe BubbleChartSpecLegendPosition) Source #

Where the legend of the chart should be drawn.

bcsDomain :: Lens' BubbleChartSpec (Maybe ChartData) Source #

The data containing the bubble x-values. These values locate the bubbles in the chart horizontally.

bcsSeries :: Lens' BubbleChartSpec (Maybe ChartData) Source #

The data contianing the bubble y-values. These values locate the bubbles in the chart vertically.

bcsBubbleLabels :: Lens' BubbleChartSpec (Maybe ChartData) Source #

The data containing the bubble labels. These do not need to be unique.

bcsGroupIds :: Lens' BubbleChartSpec (Maybe ChartData) Source #

The data containing the bubble group IDs. All bubbles with the same group ID are drawn in the same color. If bubble_sizes is specified then this field must also be specified but may contain blank values. This field is optional.

bcsBubbleMinRadiusSize :: Lens' BubbleChartSpec (Maybe Int32) Source #

The minimum radius size of the bubbles, in pixels. If specific, the field must be a positive value.

bcsBubbleMaxRadiusSize :: Lens' BubbleChartSpec (Maybe Int32) Source #

The max radius size of the bubbles, in pixels. If specified, the field must be a positive value.

bcsBubbleOpacity :: Lens' BubbleChartSpec (Maybe Double) Source #

The opacity of the bubbles between 0 and 1.0. 0 is fully transparent and 1 is fully opaque.

bcsBubbleSizes :: Lens' BubbleChartSpec (Maybe ChartData) Source #

The data contianing the bubble sizes. Bubble sizes are used to draw the bubbles at different sizes relative to each other. If specified, group_ids must also be specified. This field is optional.

DeleteRangeRequest

data DeleteRangeRequest Source #

Deletes a range of cells, shifting other cells into the deleted area.

See: deleteRangeRequest smart constructor.

Instances
Eq DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DeleteRangeRequest -> Constr #

dataTypeOf :: DeleteRangeRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteRangeRequest :: Type -> Type #

ToJSON DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteRangeRequest = D1 (MetaData "DeleteRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeleteRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_drrShiftDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteRangeRequestShiftDimension)) :*: S1 (MetaSel (Just "_drrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))))

deleteRangeRequest :: DeleteRangeRequest Source #

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

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

drrShiftDimension :: Lens' DeleteRangeRequest (Maybe DeleteRangeRequestShiftDimension) Source #

The dimension from which deleted cells will be replaced with. If ROWS, existing cells will be shifted upward to replace the deleted cells. If COLUMNS, existing cells will be shifted left to replace the deleted cells.

drrRange :: Lens' DeleteRangeRequest (Maybe GridRange) Source #

The range of cells to delete.

Sheet

data Sheet Source #

A sheet in a spreadsheet.

See: sheet smart constructor.

Instances
Eq Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

Data Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: Sheet -> Constr #

dataTypeOf :: Sheet -> DataType #

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

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

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

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

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

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

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

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

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

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

Show Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

showsPrec :: Int -> Sheet -> ShowS #

show :: Sheet -> String #

showList :: [Sheet] -> ShowS #

Generic Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Sheet :: Type -> Type #

Methods

from :: Sheet -> Rep Sheet x #

to :: Rep Sheet x -> Sheet #

ToJSON Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Sheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Sheet = D1 (MetaData "Sheet" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Sheet'" PrefixI True) (((S1 (MetaSel (Just "_sColumnGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DimensionGroup])) :*: (S1 (MetaSel (Just "_sData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GridData])) :*: S1 (MetaSel (Just "_sMerges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GridRange])))) :*: (S1 (MetaSel (Just "_sRowGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DimensionGroup])) :*: (S1 (MetaSel (Just "_sProtectedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ProtectedRange])) :*: S1 (MetaSel (Just "_sBandedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BandedRange]))))) :*: ((S1 (MetaSel (Just "_sCharts") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [EmbeddedChart])) :*: (S1 (MetaSel (Just "_sBasicFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicFilter)) :*: S1 (MetaSel (Just "_sDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeveloperMetadata])))) :*: (S1 (MetaSel (Just "_sConditionalFormats") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ConditionalFormatRule])) :*: (S1 (MetaSel (Just "_sFilterViews") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [FilterView])) :*: S1 (MetaSel (Just "_sProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SheetProperties)))))))

sheet :: Sheet Source #

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

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

sColumnGroups :: Lens' Sheet [DimensionGroup] Source #

All column groups on this sheet, ordered by increasing range start index, then by group depth.

sData :: Lens' Sheet [GridData] Source #

Data in the grid, if this is a grid sheet. The number of GridData objects returned is dependent on the number of ranges requested on this sheet. For example, if this is representing `Sheet1`, and the spreadsheet was requested with ranges `Sheet1!A1:C10` and `Sheet1!D15:E20`, then the first GridData will have a startRow/startColumn of `0`, while the second one will have `startRow 14` (zero-based row 15), and `startColumn 3` (zero-based column D).

sMerges :: Lens' Sheet [GridRange] Source #

The ranges that are merged together.

sRowGroups :: Lens' Sheet [DimensionGroup] Source #

All row groups on this sheet, ordered by increasing range start index, then by group depth.

sProtectedRanges :: Lens' Sheet [ProtectedRange] Source #

The protected ranges in this sheet.

sBandedRanges :: Lens' Sheet [BandedRange] Source #

The banded (alternating colors) ranges on this sheet.

sCharts :: Lens' Sheet [EmbeddedChart] Source #

The specifications of every chart on this sheet.

sBasicFilter :: Lens' Sheet (Maybe BasicFilter) Source #

The filter on this sheet, if any.

sDeveloperMetadata :: Lens' Sheet [DeveloperMetadata] Source #

The developer metadata associated with a sheet.

sConditionalFormats :: Lens' Sheet [ConditionalFormatRule] Source #

The conditional format rules in this sheet.

sFilterViews :: Lens' Sheet [FilterView] Source #

The filter views in this sheet.

sProperties :: Lens' Sheet (Maybe SheetProperties) Source #

The properties of the sheet.

GridCoordinate

data GridCoordinate Source #

A coordinate in a sheet. All indexes are zero-based.

See: gridCoordinate smart constructor.

Instances
Eq GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: GridCoordinate -> Constr #

dataTypeOf :: GridCoordinate -> DataType #

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

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

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

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

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

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

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

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

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

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

Show GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GridCoordinate :: Type -> Type #

ToJSON GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridCoordinate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridCoordinate = D1 (MetaData "GridCoordinate" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GridCoordinate'" PrefixI True) (S1 (MetaSel (Just "_gcColumnIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_gcRowIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_gcSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

gridCoordinate :: GridCoordinate Source #

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

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

gcColumnIndex :: Lens' GridCoordinate (Maybe Int32) Source #

The column index of the coordinate.

gcRowIndex :: Lens' GridCoordinate (Maybe Int32) Source #

The row index of the coordinate.

gcSheetId :: Lens' GridCoordinate (Maybe Int32) Source #

The sheet this coordinate is on.

ClearValuesResponse

data ClearValuesResponse Source #

The response when clearing a range of values in a spreadsheet.

See: clearValuesResponse smart constructor.

Instances
Eq ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: ClearValuesResponse -> Constr #

dataTypeOf :: ClearValuesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ClearValuesResponse :: Type -> Type #

ToJSON ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearValuesResponse = D1 (MetaData "ClearValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ClearValuesResponse'" PrefixI True) (S1 (MetaSel (Just "_cvrClearedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_cvrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

clearValuesResponse :: ClearValuesResponse Source #

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

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

cvrClearedRange :: Lens' ClearValuesResponse (Maybe Text) Source #

The range (in A1 notation) that was cleared. (If the request was for an unbounded range or a ranger larger than the bounds of the sheet, this will be the actual range that was cleared, bounded to the sheet's limits.)

cvrSpreadsheetId :: Lens' ClearValuesResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

ClearBasicFilterRequest

data ClearBasicFilterRequest Source #

Clears the basic filter, if any exists on the sheet.

See: clearBasicFilterRequest smart constructor.

Instances
Eq ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: ClearBasicFilterRequest -> Constr #

dataTypeOf :: ClearBasicFilterRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ClearBasicFilterRequest :: Type -> Type #

ToJSON ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearBasicFilterRequest = D1 (MetaData "ClearBasicFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "ClearBasicFilterRequest'" PrefixI True) (S1 (MetaSel (Just "_cbfrSheetId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

clearBasicFilterRequest :: ClearBasicFilterRequest Source #

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

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

cbfrSheetId :: Lens' ClearBasicFilterRequest (Maybe Int32) Source #

The sheet ID on which the basic filter should be cleared.

BatchGetValuesByDataFilterRequestValueRenderOption

data BatchGetValuesByDataFilterRequestValueRenderOption Source #

How values should be represented in the output. The default render option is ValueRenderOption.FORMATTED_VALUE.

Constructors

FormattedValue

FORMATTED_VALUE Values will be calculated & formatted in the reply according to the cell's formatting. Formatting is based on the spreadsheet's locale, not the requesting user's locale. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return `"$1.23"`.

UnformattedValue

UNFORMATTED_VALUE Values will be calculated, but not formatted in the reply. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return the number `1.23`.

Formula

FORMULA Values will not be calculated. The reply will include the formulas. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then A2 would return `"=A1"`.

Instances
Enum BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BatchGetValuesByDataFilterRequestValueRenderOption -> Constr #

dataTypeOf :: BatchGetValuesByDataFilterRequestValueRenderOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestValueRenderOption = D1 (MetaData "BatchGetValuesByDataFilterRequestValueRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "FormattedValue" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "UnformattedValue" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Formula" PrefixI False) (U1 :: Type -> Type)))

UpdateEmbeddedObjectPositionRequest

data UpdateEmbeddedObjectPositionRequest Source #

Update an embedded object's position (such as a moving or resizing a chart or image).

See: updateEmbeddedObjectPositionRequest smart constructor.

Instances
Eq UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: UpdateEmbeddedObjectPositionRequest -> Constr #

dataTypeOf :: UpdateEmbeddedObjectPositionRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateEmbeddedObjectPositionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateEmbeddedObjectPositionRequest = D1 (MetaData "UpdateEmbeddedObjectPositionRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateEmbeddedObjectPositionRequest'" PrefixI True) (S1 (MetaSel (Just "_ueoprNewPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EmbeddedObjectPosition)) :*: (S1 (MetaSel (Just "_ueoprObjectId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_ueoprFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

updateEmbeddedObjectPositionRequest :: UpdateEmbeddedObjectPositionRequest Source #

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

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

ueoprNewPosition :: Lens' UpdateEmbeddedObjectPositionRequest (Maybe EmbeddedObjectPosition) Source #

An explicit position to move the embedded object to. If newPosition.sheetId is set, a new sheet with that ID will be created. If newPosition.newSheet is set to true, a new sheet will be created with an ID that will be chosen for you.

ueoprFields :: Lens' UpdateEmbeddedObjectPositionRequest (Maybe GFieldMask) Source #

The fields of OverlayPosition that should be updated when setting a new position. Used only if newPosition.overlayPosition is set, in which case at least one field must be specified. The root `newPosition.overlayPosition` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

SourceAndDestinationDimension

data SourceAndDestinationDimension Source #

The dimension that data should be filled into.

Constructors

SADDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

SADDRows

ROWS Operates on the rows of a sheet.

SADDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: SourceAndDestinationDimension -> Constr #

dataTypeOf :: SourceAndDestinationDimension -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep SourceAndDestinationDimension :: Type -> Type #

Hashable SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SourceAndDestinationDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SourceAndDestinationDimension = D1 (MetaData "SourceAndDestinationDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SADDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SADDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SADDColumns" PrefixI False) (U1 :: Type -> Type)))

BooleanRule

data BooleanRule Source #

A rule that may or may not match, depending on the condition.

See: booleanRule smart constructor.

Instances
Eq BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BooleanRule -> Constr #

dataTypeOf :: BooleanRule -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BooleanRule :: Type -> Type #

ToJSON BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BooleanRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BooleanRule = D1 (MetaData "BooleanRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BooleanRule'" PrefixI True) (S1 (MetaSel (Just "_brFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormat)) :*: S1 (MetaSel (Just "_brCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BooleanCondition))))

booleanRule :: BooleanRule Source #

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

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

brFormat :: Lens' BooleanRule (Maybe CellFormat) Source #

The format to apply. Conditional formatting can only apply a subset of formatting: bold, italic, strikethrough, foreground color & background color.

brCondition :: Lens' BooleanRule (Maybe BooleanCondition) Source #

The condition of the rule. If the condition evaluates to true, the format is applied.

CellFormatWrapStrategy

data CellFormatWrapStrategy Source #

The wrap strategy for the value in the cell.

Constructors

WrapStrategyUnspecified

WRAP_STRATEGY_UNSPECIFIED The default value, do not use.

OverflowCell

OVERFLOW_CELL Lines that are longer than the cell width will be written in the next cell over, so long as that cell is empty. If the next cell over is non-empty, this behaves the same as CLIP. The text will never wrap to the next line unless the user manually inserts a new line. Example: | First sentence. | | Manual newline that is very long. <- Text continues into next cell | Next newline. |

LegacyWrap

LEGACY_WRAP This wrap strategy represents the old Google Sheets wrap strategy where words that are longer than a line are clipped rather than broken. This strategy is not supported on all platforms and is being phased out. Example: | Cell has a | | loooooooooo| <- Word is clipped. | word. |

Clip

CLIP Lines that are longer than the cell width will be clipped. The text will never wrap to the next line unless the user manually inserts a new line. Example: | First sentence. | | Manual newline t| <- Text is clipped | Next newline. |

Wrap

WRAP Words that are longer than a line are wrapped at the character level rather than clipped. Example: | Cell has a | | loooooooooo| <- Word is broken. | ong word. |

Instances
Enum CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: CellFormatWrapStrategy -> Constr #

dataTypeOf :: CellFormatWrapStrategy -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CellFormatWrapStrategy :: Type -> Type #

Hashable CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatWrapStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatWrapStrategy = D1 (MetaData "CellFormatWrapStrategy" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "WrapStrategyUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OverflowCell" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "LegacyWrap" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Clip" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Wrap" PrefixI False) (U1 :: Type -> Type))))

BatchGetValuesByDataFilterResponse

data BatchGetValuesByDataFilterResponse Source #

The response when retrieving more than one range of values in a spreadsheet selected by DataFilters.

See: batchGetValuesByDataFilterResponse smart constructor.

Instances
Eq BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BatchGetValuesByDataFilterResponse -> Constr #

dataTypeOf :: BatchGetValuesByDataFilterResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchGetValuesByDataFilterResponse :: Type -> Type #

ToJSON BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesByDataFilterResponse = D1 (MetaData "BatchGetValuesByDataFilterResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchGetValuesByDataFilterResponse'" PrefixI True) (S1 (MetaSel (Just "_bgvbdfrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bgvbdfrValueRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [MatchedValueRange]))))

batchGetValuesByDataFilterResponse :: BatchGetValuesByDataFilterResponse Source #

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

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

bgvbdfrSpreadsheetId :: Lens' BatchGetValuesByDataFilterResponse (Maybe Text) Source #

The ID of the spreadsheet the data was retrieved from.

bgvbdfrValueRanges :: Lens' BatchGetValuesByDataFilterResponse [MatchedValueRange] Source #

The requested values with the list of data filters that matched them.

SourceAndDestination

data SourceAndDestination Source #

A combination of a source range and how to extend that source.

See: sourceAndDestination smart constructor.

Instances
Eq SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: SourceAndDestination -> Constr #

dataTypeOf :: SourceAndDestination -> DataType #

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

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

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

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

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

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

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

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

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

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

Show SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SourceAndDestination :: Type -> Type #

ToJSON SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SourceAndDestination Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SourceAndDestination = D1 (MetaData "SourceAndDestination" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SourceAndDestination'" PrefixI True) (S1 (MetaSel (Just "_sadDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceAndDestinationDimension)) :*: (S1 (MetaSel (Just "_sadSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_sadFillLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

sourceAndDestination :: SourceAndDestination Source #

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

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

sadDimension :: Lens' SourceAndDestination (Maybe SourceAndDestinationDimension) Source #

The dimension that data should be filled into.

sadSource :: Lens' SourceAndDestination (Maybe GridRange) Source #

The location of the data to use as the source of the autofill.

sadFillLength :: Lens' SourceAndDestination (Maybe Int32) Source #

The number of rows or columns that data should be filled into. Positive numbers expand beyond the last row or last column of the source. Negative numbers expand before the first row or first column of the source.

PasteDataRequest

data PasteDataRequest Source #

Inserts data into the spreadsheet starting at the specified coordinate.

See: pasteDataRequest smart constructor.

Instances
Eq PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: PasteDataRequest -> Constr #

dataTypeOf :: PasteDataRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PasteDataRequest :: Type -> Type #

ToJSON PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PasteDataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PasteDataRequest = D1 (MetaData "PasteDataRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PasteDataRequest'" PrefixI True) ((S1 (MetaSel (Just "_pdrData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_pdrCoordinate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridCoordinate))) :*: (S1 (MetaSel (Just "_pdrHTML") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_pdrType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PasteDataRequestType)) :*: S1 (MetaSel (Just "_pdrDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

pasteDataRequest :: PasteDataRequest Source #

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

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

pdrData :: Lens' PasteDataRequest (Maybe Text) Source #

The data to insert.

pdrCoordinate :: Lens' PasteDataRequest (Maybe GridCoordinate) Source #

The coordinate at which the data should start being inserted.

pdrHTML :: Lens' PasteDataRequest (Maybe Bool) Source #

True if the data is HTML.

pdrType :: Lens' PasteDataRequest (Maybe PasteDataRequestType) Source #

How the data should be pasted.

pdrDelimiter :: Lens' PasteDataRequest (Maybe Text) Source #

The delimiter in the data.

BatchUpdateValuesRequestValueInputOption

data BatchUpdateValuesRequestValueInputOption Source #

How the input data should be interpreted.

Constructors

InputValueOptionUnspecified

INPUT_VALUE_OPTION_UNSPECIFIED Default input value. This value must not be used.

Raw

RAW The values the user has entered will not be parsed and will be stored as-is.

UserEntered

USER_ENTERED The values will be parsed as if the user typed them into the UI. Numbers will stay as numbers, but strings may be converted to numbers, dates, etc. following the same rules that are applied when entering text into a cell via the Google Sheets UI.

Instances
Enum BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BatchUpdateValuesRequestValueInputOption -> Constr #

dataTypeOf :: BatchUpdateValuesRequestValueInputOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestValueInputOption = D1 (MetaData "BatchUpdateValuesRequestValueInputOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "InputValueOptionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Raw" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "UserEntered" PrefixI False) (U1 :: Type -> Type)))

AppendCellsRequest

data AppendCellsRequest Source #

Adds new cells after the last row with data in a sheet, inserting new rows into the sheet if necessary.

See: appendCellsRequest smart constructor.

Instances
Eq AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AppendCellsRequest -> Constr #

dataTypeOf :: AppendCellsRequest -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AppendCellsRequest :: Type -> Type #

ToJSON AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendCellsRequest = D1 (MetaData "AppendCellsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "AppendCellsRequest'" PrefixI True) (S1 (MetaSel (Just "_acrRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [RowData])) :*: (S1 (MetaSel (Just "_acrSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_acrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

appendCellsRequest :: AppendCellsRequest Source #

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

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

acrSheetId :: Lens' AppendCellsRequest (Maybe Int32) Source #

The sheet ID to append the data to.

acrFields :: Lens' AppendCellsRequest (Maybe GFieldMask) Source #

The fields of CellData that should be updated. At least one field must be specified. The root is the CellData; 'row.values.' should not be specified. A single `"*"` can be used as short-hand for listing every field.

FindReplaceResponse

data FindReplaceResponse Source #

The result of the find/replace.

See: findReplaceResponse smart constructor.

Instances
Eq FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: FindReplaceResponse -> Constr #

dataTypeOf :: FindReplaceResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep FindReplaceResponse :: Type -> Type #

ToJSON FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FindReplaceResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FindReplaceResponse = D1 (MetaData "FindReplaceResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "FindReplaceResponse'" PrefixI True) ((S1 (MetaSel (Just "_frrValuesChanged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_frrFormulasChanged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_frrRowsChanged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_frrSheetsChanged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_frrOccurrencesChanged") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

findReplaceResponse :: FindReplaceResponse Source #

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

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

frrValuesChanged :: Lens' FindReplaceResponse (Maybe Int32) Source #

The number of non-formula cells changed.

frrFormulasChanged :: Lens' FindReplaceResponse (Maybe Int32) Source #

The number of formula cells changed.

frrRowsChanged :: Lens' FindReplaceResponse (Maybe Int32) Source #

The number of rows changed.

frrSheetsChanged :: Lens' FindReplaceResponse (Maybe Int32) Source #

The number of sheets changed.

frrOccurrencesChanged :: Lens' FindReplaceResponse (Maybe Int32) Source #

The number of occurrences (possibly multiple within a cell) changed. For example, if replacing `"e"` with `"o"` in `"Google Sheets"`, this would be `"3"` because `"Google Sheets"` -> `"Googlo Shoots"`.

AddDimensionGroupResponse

data AddDimensionGroupResponse Source #

The result of adding a group.

See: addDimensionGroupResponse smart constructor.

Instances
Eq AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AddDimensionGroupResponse -> Constr #

dataTypeOf :: AddDimensionGroupResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddDimensionGroupResponse :: Type -> Type #

ToJSON AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddDimensionGroupResponse = D1 (MetaData "AddDimensionGroupResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddDimensionGroupResponse'" PrefixI True) (S1 (MetaSel (Just "_adgrDimensionGroups") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DimensionGroup]))))

addDimensionGroupResponse :: AddDimensionGroupResponse Source #

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

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

adgrDimensionGroups :: Lens' AddDimensionGroupResponse [DimensionGroup] Source #

All groups of a dimension after adding a group to that dimension.

PieChartSpec

data PieChartSpec Source #

A pie chart.

See: pieChartSpec smart constructor.

Instances
Eq PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: PieChartSpec -> Constr #

dataTypeOf :: PieChartSpec -> DataType #

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

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

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

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

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

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

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

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

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

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

Show PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PieChartSpec :: Type -> Type #

ToJSON PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PieChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PieChartSpec = D1 (MetaData "PieChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PieChartSpec'" PrefixI True) ((S1 (MetaSel (Just "_pcsPieHole") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_pcsLegendPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PieChartSpecLegendPosition))) :*: (S1 (MetaSel (Just "_pcsDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: (S1 (MetaSel (Just "_pcsSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_pcsThreeDimensional") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))

pieChartSpec :: PieChartSpec Source #

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

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

pcsPieHole :: Lens' PieChartSpec (Maybe Double) Source #

The size of the hole in the pie chart.

pcsLegendPosition :: Lens' PieChartSpec (Maybe PieChartSpecLegendPosition) Source #

Where the legend of the pie chart should be drawn.

pcsDomain :: Lens' PieChartSpec (Maybe ChartData) Source #

The data that covers the domain of the pie chart.

pcsSeries :: Lens' PieChartSpec (Maybe ChartData) Source #

The data that covers the one and only series of the pie chart.

pcsThreeDimensional :: Lens' PieChartSpec (Maybe Bool) Source #

True if the pie is three dimensional.

BatchUpdateValuesByDataFilterResponse

data BatchUpdateValuesByDataFilterResponse Source #

The response when updating a range of values in a spreadsheet.

See: batchUpdateValuesByDataFilterResponse smart constructor.

Instances
Eq BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: BatchUpdateValuesByDataFilterResponse -> Constr #

dataTypeOf :: BatchUpdateValuesByDataFilterResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesByDataFilterResponse = D1 (MetaData "BatchUpdateValuesByDataFilterResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateValuesByDataFilterResponse'" PrefixI True) ((S1 (MetaSel (Just "_buvbdfrTotalUpdatedColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_buvbdfrResponses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [UpdateValuesByDataFilterResponse])) :*: S1 (MetaSel (Just "_buvbdfrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_buvbdfrTotalUpdatedSheets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_buvbdfrTotalUpdatedCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_buvbdfrTotalUpdatedRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

buvbdfrTotalUpdatedColumns :: Lens' BatchUpdateValuesByDataFilterResponse (Maybe Int32) Source #

The total number of columns where at least one cell in the column was updated.

buvbdfrSpreadsheetId :: Lens' BatchUpdateValuesByDataFilterResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

buvbdfrTotalUpdatedSheets :: Lens' BatchUpdateValuesByDataFilterResponse (Maybe Int32) Source #

The total number of sheets where at least one cell in the sheet was updated.

buvbdfrTotalUpdatedRows :: Lens' BatchUpdateValuesByDataFilterResponse (Maybe Int32) Source #

The total number of rows where at least one cell in the row was updated.

TextPositionHorizontalAlignment

data TextPositionHorizontalAlignment Source #

Horizontal alignment setting for the piece of text.

Constructors

HorizontalAlignUnspecified

HORIZONTAL_ALIGN_UNSPECIFIED The horizontal alignment is not specified. Do not use this.

Left'

LEFT The text is explicitly aligned to the left of the cell.

Center

CENTER The text is explicitly aligned to the center of the cell.

Right'

RIGHT The text is explicitly aligned to the right of the cell.

Instances
Enum TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: TextPositionHorizontalAlignment -> Constr #

dataTypeOf :: TextPositionHorizontalAlignment -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep TextPositionHorizontalAlignment :: Type -> Type #

Hashable TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep TextPositionHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep TextPositionHorizontalAlignment = D1 (MetaData "TextPositionHorizontalAlignment" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "HorizontalAlignUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Left'" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Center" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Right'" PrefixI False) (U1 :: Type -> Type)))

AppendValuesResponse

data AppendValuesResponse Source #

The response when updating a range of values in a spreadsheet.

See: appendValuesResponse smart constructor.

Instances
Eq AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: AppendValuesResponse -> Constr #

dataTypeOf :: AppendValuesResponse -> DataType #

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

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

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

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

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

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

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

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

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

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

Show AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AppendValuesResponse :: Type -> Type #

ToJSON AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendValuesResponse = D1 (MetaData "AppendValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "AppendValuesResponse'" PrefixI True) (S1 (MetaSel (Just "_avrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_avrUpdates") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateValuesResponse)) :*: S1 (MetaSel (Just "_avrTableRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

appendValuesResponse :: AppendValuesResponse Source #

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

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

avrSpreadsheetId :: Lens' AppendValuesResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

avrUpdates :: Lens' AppendValuesResponse (Maybe UpdateValuesResponse) Source #

Information about the updates that were applied.

avrTableRange :: Lens' AppendValuesResponse (Maybe Text) Source #

The range (in A1 notation) of the table that values are being appended to (before the values were appended). Empty if no table was found.

DeveloperMetadataVisibility

data DeveloperMetadataVisibility Source #

The metadata visibility. Developer metadata must always have a visibility specified.

Constructors

DeveloperMetadataVisibilityUnspecified

DEVELOPER_METADATA_VISIBILITY_UNSPECIFIED Default value.

Document

DOCUMENT Document-visible metadata is accessible from any developer project with access to the document.

Project

PROJECT Project-visible metadata is only visible to and accessible by the developer project that created the metadata.

Instances
Enum DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: DeveloperMetadataVisibility -> Constr #

dataTypeOf :: DeveloperMetadataVisibility -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DeveloperMetadataVisibility :: Type -> Type #

Hashable DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataVisibility = D1 (MetaData "DeveloperMetadataVisibility" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeveloperMetadataVisibilityUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Document" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Project" PrefixI False) (U1 :: Type -> Type)))

BatchUpdateValuesRequestResponseValueRenderOption

data BatchUpdateValuesRequestResponseValueRenderOption Source #

Determines how values in the response should be rendered. The default render option is ValueRenderOption.FORMATTED_VALUE.

Constructors

BUVRRVROFormattedValue

FORMATTED_VALUE Values will be calculated & formatted in the reply according to the cell's formatting. Formatting is based on the spreadsheet's locale, not the requesting user's locale. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return `"$1.23"`.

BUVRRVROUnformattedValue

UNFORMATTED_VALUE Values will be calculated, but not formatted in the reply. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return the number `1.23`.

BUVRRVROFormula

FORMULA Values will not be calculated. The reply will include the formulas. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then A2 would return `"=A1"`.

Instances
Enum BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

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

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

toConstr :: BatchUpdateValuesRequestResponseValueRenderOption -> Constr #

dataTypeOf :: BatchUpdateValuesRequestResponseValueRenderOption -> DataType #

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

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

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

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

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

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

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

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

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

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

Ord BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesRequestResponseValueRenderOption = D1 (MetaData "BatchUpdateValuesRequestResponseValueRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BUVRRVROFormattedValue" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BUVRRVROUnformattedValue" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BUVRRVROFormula" PrefixI False) (U1 :: Type -> Type)))

DataValidationRule

data DataValidationRule Source #

A data validation rule.

See: dataValidationRule smart constructor.

Instances
Eq DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

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

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

toConstr :: DataValidationRule -> Constr #

dataTypeOf :: DataValidationRule -> DataType #

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

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

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

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

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

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

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

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataValidationRule -> m DataValidationRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataValidationRule -> m DataValidationRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataValidationRule -> m DataValidationRule #

Show DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DataValidationRule :: Type -> Type #

ToJSON DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataValidationRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataValidationRule = D1 (MetaData "DataValidationRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DataValidationRule'" PrefixI True) ((S1 (MetaSel (Just "_dvrShowCustomUi") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dvrInputMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_dvrStrict") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dvrCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BooleanCondition)))))

dataValidationRule :: DataValidationRule Source #

Creates a value of DataValidationRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dvrShowCustomUi :: Lens' DataValidationRule (Maybe Bool) Source #

True if the UI should be customized based on the kind of condition. If true, "List" conditions will show a dropdown.

dvrInputMessage :: Lens' DataValidationRule (Maybe Text) Source #

A message to show the user when adding data to the cell.

dvrStrict :: Lens' DataValidationRule (Maybe Bool) Source #

True if invalid data should be rejected.

dvrCondition :: Lens' DataValidationRule (Maybe BooleanCondition) Source #

The condition that data in the cell must match.

FilterView

data FilterView Source #

A filter view.

See: filterView smart constructor.

Instances
Eq FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FilterView -> c FilterView #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FilterView #

toConstr :: FilterView -> Constr #

dataTypeOf :: FilterView -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FilterView) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterView) #

gmapT :: (forall b. Data b => b -> b) -> FilterView -> FilterView #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FilterView -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FilterView -> r #

gmapQ :: (forall d. Data d => d -> u) -> FilterView -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FilterView -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FilterView -> m FilterView #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterView -> m FilterView #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterView -> m FilterView #

Show FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep FilterView :: Type -> Type #

ToJSON FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FilterView Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

filterView :: FilterView Source #

Creates a value of FilterView with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fvSortSpecs :: Lens' FilterView [SortSpec] Source #

The sort order per column. Later specifications are used when values are equal in the earlier specifications.

fvNamedRangeId :: Lens' FilterView (Maybe Text) Source #

The named range this filter view is backed by, if any. When writing, only one of range or named_range_id may be set.

fvRange :: Lens' FilterView (Maybe GridRange) Source #

The range this filter view covers. When writing, only one of range or named_range_id may be set.

fvFilterViewId :: Lens' FilterView (Maybe Int32) Source #

The ID of the filter view.

fvTitle :: Lens' FilterView (Maybe Text) Source #

The name of the filter view.

fvCriteria :: Lens' FilterView (Maybe FilterViewCriteria) Source #

The criteria for showing/hiding values per column. The map's key is the column index, and the value is the criteria for that column.

Color

data Color Source #

Represents a color in the RGBA color space. This representation is designed for simplicity of conversion to/from color representations in various languages over compactness; for example, the fields of this representation can be trivially provided to the constructor of "java.awt.Color" in Java; it can also be trivially provided to UIColor's "+colorWithRed:green:blue:alpha" method in iOS; and, with just a little work, it can be easily formatted into a CSS "rgba()" string in JavaScript, as well. Here are some examples: Example (Java): import com.google.type.Color; // ... public static java.awt.Color fromProto(Color protocolor) { float alpha = protocolor.hasAlpha() ? protocolor.getAlpha().getValue() : 1.0; return new java.awt.Color( protocolor.getRed(), protocolor.getGreen(), protocolor.getBlue(), alpha); } public static Color toProto(java.awt.Color color) { float red = (float) color.getRed(); float green = (float) color.getGreen(); float blue = (float) color.getBlue(); float denominator = 255.0; Color.Builder resultBuilder = Color .newBuilder() .setRed(red / denominator) .setGreen(green / denominator) .setBlue(blue / denominator); int alpha = color.getAlpha(); if (alpha != 255) { result.setAlpha( FloatValue .newBuilder() .setValue(((float) alpha) / denominator) .build()); } return resultBuilder.build(); } // ... Example (iOS / Obj-C): // ... static UIColor* fromProto(Color* protocolor) { float red = [protocolor red]; float green = [protocolor green]; float blue = [protocolor blue]; FloatValue* alpha_wrapper = [protocolor alpha]; float alpha = 1.0; if (alpha_wrapper != nil) { alpha = [alpha_wrapper value]; } return [UIColor colorWithRed:red green:green blue:blue alpha:alpha]; } static Color* toProto(UIColor* color) { CGFloat red, green, blue, alpha; if (![color getRed:&red green:&green blue:&blue alpha:&alpha]) { return nil; } Color* result = [[Color alloc] init]; [result setRed:red]; [result setGreen:green]; [result setBlue:blue]; if (alpha <= 0.9999) { [result setAlpha:floatWrapperWithValue(alpha)]; } [result autorelease]; return result; } // ... Example (JavaScript): // ... var protoToCssColor = function(rgb_color) { var redFrac = rgb_color.red || 0.0; var greenFrac = rgb_color.green || 0.0; var blueFrac = rgb_color.blue || 0.0; var red = Math.floor(redFrac * 255); var green = Math.floor(greenFrac * 255); var blue = Math.floor(blueFrac * 255); if (!('alpha' in rgb_color)) { return rgbToCssColor_(red, green, blue); } var alphaFrac = rgb_color.alpha.value || 0.0; var rgbParams = [red, green, blue].join(','); return ['rgba(', rgbParams, ',', alphaFrac, ')'].join(''); }; var rgbToCssColor_ = function(red, green, blue) { var rgbNumber = new Number((red << 16) | (green << 8) | blue); var hexString = rgbNumber.toString(16); var missingZeros = 6 - hexString.length; var resultBuilder = ['#']; for (var i = 0; i < missingZeros; i++) { resultBuilder.push('0'); } resultBuilder.push(hexString); return resultBuilder.join(''); }; // ...

See: color smart constructor.

Instances
Eq Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

(==) :: Color -> Color -> Bool #

(/=) :: Color -> Color -> Bool #

Data Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Color -> c Color #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Color #

toConstr :: Color -> Constr #

dataTypeOf :: Color -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Color) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Color) #

gmapT :: (forall b. Data b => b -> b) -> Color -> Color #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Color -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Color -> r #

gmapQ :: (forall d. Data d => d -> u) -> Color -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Color -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Color -> m Color #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Color -> m Color #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Color -> m Color #

Show Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

showsPrec :: Int -> Color -> ShowS #

show :: Color -> String #

showList :: [Color] -> ShowS #

Generic Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Color :: Type -> Type #

Methods

from :: Color -> Rep Color x #

to :: Rep Color x -> Color #

ToJSON Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Color Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

color :: Color Source #

Creates a value of Color with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cRed :: Lens' Color (Maybe Double) Source #

The amount of red in the color as a value in the interval [0, 1].

cAlpha :: Lens' Color (Maybe Double) Source #

The fraction of this color that should be applied to the pixel. That is, the final pixel color is defined by the equation: pixel color = alpha * (this color) + (1.0 - alpha) * (background color) This means that a value of 1.0 corresponds to a solid color, whereas a value of 0.0 corresponds to a completely transparent color. This uses a wrapper message rather than a simple float scalar so that it is possible to distinguish between a default value and the value being unset. If omitted, this color object is to be rendered as a solid color (as if the alpha value had been explicitly given with a value of 1.0).

cGreen :: Lens' Color (Maybe Double) Source #

The amount of green in the color as a value in the interval [0, 1].

cBlue :: Lens' Color (Maybe Double) Source #

The amount of blue in the color as a value in the interval [0, 1].

DeleteFilterViewRequest

data DeleteFilterViewRequest Source #

Deletes a particular filter view.

See: deleteFilterViewRequest smart constructor.

Instances
Eq DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteFilterViewRequest -> c DeleteFilterViewRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteFilterViewRequest #

toConstr :: DeleteFilterViewRequest -> Constr #

dataTypeOf :: DeleteFilterViewRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteFilterViewRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteFilterViewRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteFilterViewRequest -> DeleteFilterViewRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteFilterViewRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteFilterViewRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteFilterViewRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteFilterViewRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteFilterViewRequest -> m DeleteFilterViewRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteFilterViewRequest -> m DeleteFilterViewRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteFilterViewRequest -> m DeleteFilterViewRequest #

Show DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteFilterViewRequest :: Type -> Type #

ToJSON DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteFilterViewRequest = D1 (MetaData "DeleteFilterViewRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteFilterViewRequest'" PrefixI True) (S1 (MetaSel (Just "_dfvrFilterId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

deleteFilterViewRequest :: DeleteFilterViewRequest Source #

Creates a value of DeleteFilterViewRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfvrFilterId :: Lens' DeleteFilterViewRequest (Maybe Int32) Source #

The ID of the filter to delete.

UpdateFilterViewRequest

data UpdateFilterViewRequest Source #

Updates properties of the filter view.

See: updateFilterViewRequest smart constructor.

Instances
Eq UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateFilterViewRequest -> c UpdateFilterViewRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateFilterViewRequest #

toConstr :: UpdateFilterViewRequest -> Constr #

dataTypeOf :: UpdateFilterViewRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateFilterViewRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateFilterViewRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateFilterViewRequest -> UpdateFilterViewRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateFilterViewRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateFilterViewRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateFilterViewRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateFilterViewRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateFilterViewRequest -> m UpdateFilterViewRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateFilterViewRequest -> m UpdateFilterViewRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateFilterViewRequest -> m UpdateFilterViewRequest #

Show UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateFilterViewRequest :: Type -> Type #

ToJSON UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateFilterViewRequest = D1 (MetaData "UpdateFilterViewRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateFilterViewRequest'" PrefixI True) (S1 (MetaSel (Just "_ufvrFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FilterView)) :*: S1 (MetaSel (Just "_ufvrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask))))

updateFilterViewRequest :: UpdateFilterViewRequest Source #

Creates a value of UpdateFilterViewRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ufvrFilter :: Lens' UpdateFilterViewRequest (Maybe FilterView) Source #

The new properties of the filter view.

ufvrFields :: Lens' UpdateFilterViewRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `filter` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

BasicChartSeries

data BasicChartSeries Source #

A single series of data in a chart. For example, if charting stock prices over time, multiple series may exist, one for the "Open Price", "High Price", "Low Price" and "Close Price".

See: basicChartSeries smart constructor.

Instances
Eq BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSeries -> c BasicChartSeries #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSeries #

toConstr :: BasicChartSeries -> Constr #

dataTypeOf :: BasicChartSeries -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSeries) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSeries) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSeries -> BasicChartSeries #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSeries -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSeries -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSeries -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSeries -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSeries -> m BasicChartSeries #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSeries -> m BasicChartSeries #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSeries -> m BasicChartSeries #

Show BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicChartSeries :: Type -> Type #

ToJSON BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

basicChartSeries :: BasicChartSeries Source #

Creates a value of BasicChartSeries with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bTargetAxis :: Lens' BasicChartSeries (Maybe BasicChartSeriesTargetAxis) Source #

The minor axis that will specify the range of values for this series. For example, if charting stocks over time, the "Volume" series may want to be pinned to the right with the prices pinned to the left, because the scale of trading volume is different than the scale of prices. It is an error to specify an axis that isn't a valid minor axis for the chart's type.

bColor :: Lens' BasicChartSeries (Maybe Color) Source #

The color for elements (i.e. bars, lines, points) associated with this series. If empty, a default color is used.

bSeries :: Lens' BasicChartSeries (Maybe ChartData) Source #

The data being visualized in this chart series.

bType :: Lens' BasicChartSeries (Maybe BasicChartSeriesType) Source #

The type of this series. Valid only if the chartType is COMBO. Different types will change the way the series is visualized. Only LINE, AREA, and COLUMN are supported.

bLineStyle :: Lens' BasicChartSeries (Maybe LineStyle) Source #

The line style of this series. Valid only if the chartType is AREA, LINE, or SCATTER. COMBO charts are also supported if the series chart type is AREA or LINE.

PivotGroupRule

data PivotGroupRule Source #

An optional setting on a PivotGroup that defines buckets for the values in the source data column rather than breaking out each individual value. Only one PivotGroup with a group rule may be added for each column in the source data, though on any given column you may add both a PivotGroup that has a rule and a PivotGroup that does not.

See: pivotGroupRule smart constructor.

Instances
Eq PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotGroupRule -> c PivotGroupRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotGroupRule #

toConstr :: PivotGroupRule -> Constr #

dataTypeOf :: PivotGroupRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotGroupRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotGroupRule) #

gmapT :: (forall b. Data b => b -> b) -> PivotGroupRule -> PivotGroupRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotGroupRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotGroupRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotGroupRule -> m PivotGroupRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupRule -> m PivotGroupRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupRule -> m PivotGroupRule #

Show PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotGroupRule :: Type -> Type #

ToJSON PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupRule = D1 (MetaData "PivotGroupRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PivotGroupRule'" PrefixI True) (S1 (MetaSel (Just "_pgrDateTimeRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DateTimeRule)) :*: (S1 (MetaSel (Just "_pgrManualRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ManualRule)) :*: S1 (MetaSel (Just "_pgrHistogramRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HistogramRule)))))

pivotGroupRule :: PivotGroupRule Source #

Creates a value of PivotGroupRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AddProtectedRangeRequest

data AddProtectedRangeRequest Source #

Adds a new protected range.

See: addProtectedRangeRequest smart constructor.

Instances
Eq AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddProtectedRangeRequest -> c AddProtectedRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddProtectedRangeRequest #

toConstr :: AddProtectedRangeRequest -> Constr #

dataTypeOf :: AddProtectedRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddProtectedRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddProtectedRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddProtectedRangeRequest -> AddProtectedRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddProtectedRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddProtectedRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddProtectedRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddProtectedRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddProtectedRangeRequest -> m AddProtectedRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddProtectedRangeRequest -> m AddProtectedRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddProtectedRangeRequest -> m AddProtectedRangeRequest #

Show AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddProtectedRangeRequest :: Type -> Type #

ToJSON AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddProtectedRangeRequest = D1 (MetaData "AddProtectedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddProtectedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_aprrProtectedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ProtectedRange))))

addProtectedRangeRequest :: AddProtectedRangeRequest Source #

Creates a value of AddProtectedRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aprrProtectedRange :: Lens' AddProtectedRangeRequest (Maybe ProtectedRange) Source #

The protected range to be added. The protectedRangeId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a range that already exists.)

PieChartSpecLegendPosition

data PieChartSpecLegendPosition Source #

Where the legend of the pie chart should be drawn.

Constructors

PCSLPPieChartLegendPositionUnspecified

PIE_CHART_LEGEND_POSITION_UNSPECIFIED Default value, do not use.

PCSLPBottomLegend

BOTTOM_LEGEND The legend is rendered on the bottom of the chart.

PCSLPLeftLegend

LEFT_LEGEND The legend is rendered on the left of the chart.

PCSLPRightLegend

RIGHT_LEGEND The legend is rendered on the right of the chart.

PCSLPTopLegend

TOP_LEGEND The legend is rendered on the top of the chart.

PCSLPNoLegend

NO_LEGEND No legend is rendered.

PCSLPLabeledLegend

LABELED_LEGEND Each pie slice has a label attached to it.

Instances
Enum PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PieChartSpecLegendPosition -> c PieChartSpecLegendPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PieChartSpecLegendPosition #

toConstr :: PieChartSpecLegendPosition -> Constr #

dataTypeOf :: PieChartSpecLegendPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PieChartSpecLegendPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PieChartSpecLegendPosition) #

gmapT :: (forall b. Data b => b -> b) -> PieChartSpecLegendPosition -> PieChartSpecLegendPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PieChartSpecLegendPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PieChartSpecLegendPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> PieChartSpecLegendPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PieChartSpecLegendPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PieChartSpecLegendPosition -> m PieChartSpecLegendPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PieChartSpecLegendPosition -> m PieChartSpecLegendPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PieChartSpecLegendPosition -> m PieChartSpecLegendPosition #

Ord PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PieChartSpecLegendPosition :: Type -> Type #

Hashable PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PieChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PieChartSpecLegendPosition = D1 (MetaData "PieChartSpecLegendPosition" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "PCSLPPieChartLegendPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PCSLPBottomLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PCSLPLeftLegend" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PCSLPRightLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PCSLPTopLegend" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PCSLPNoLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PCSLPLabeledLegend" PrefixI False) (U1 :: Type -> Type))))

RepeatCellRequest

data RepeatCellRequest Source #

Updates all cells in the range to the values in the given Cell object. Only the fields listed in the fields field are updated; others are unchanged. If writing a cell with a formula, the formula's ranges will automatically increment for each field in the range. For example, if writing a cell with formula `=A1` into range B2:C4, B2 would be `=A1`, B3 would be `=A2`, B4 would be `=A3`, C2 would be `=B1`, C3 would be `=B2`, C4 would be `=B3`. To keep the formula's ranges static, use the `$` indicator. For example, use the formula `=$A$1` to prevent both the row and the column from incrementing.

See: repeatCellRequest smart constructor.

Instances
Eq RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RepeatCellRequest -> c RepeatCellRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RepeatCellRequest #

toConstr :: RepeatCellRequest -> Constr #

dataTypeOf :: RepeatCellRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RepeatCellRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RepeatCellRequest) #

gmapT :: (forall b. Data b => b -> b) -> RepeatCellRequest -> RepeatCellRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RepeatCellRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RepeatCellRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> RepeatCellRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RepeatCellRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RepeatCellRequest -> m RepeatCellRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RepeatCellRequest -> m RepeatCellRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RepeatCellRequest -> m RepeatCellRequest #

Show RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep RepeatCellRequest :: Type -> Type #

ToJSON RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RepeatCellRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RepeatCellRequest = D1 (MetaData "RepeatCellRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "RepeatCellRequest'" PrefixI True) (S1 (MetaSel (Just "_rcrCell") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellData)) :*: (S1 (MetaSel (Just "_rcrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_rcrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

repeatCellRequest :: RepeatCellRequest Source #

Creates a value of RepeatCellRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rcrRange :: Lens' RepeatCellRequest (Maybe GridRange) Source #

The range to repeat the cell in.

rcrFields :: Lens' RepeatCellRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `cell` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

ConditionValue

data ConditionValue Source #

The value of the condition.

See: conditionValue smart constructor.

Instances
Eq ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConditionValue -> c ConditionValue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConditionValue #

toConstr :: ConditionValue -> Constr #

dataTypeOf :: ConditionValue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConditionValue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConditionValue) #

gmapT :: (forall b. Data b => b -> b) -> ConditionValue -> ConditionValue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConditionValue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConditionValue -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConditionValue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConditionValue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConditionValue -> m ConditionValue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionValue -> m ConditionValue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionValue -> m ConditionValue #

Show ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ConditionValue :: Type -> Type #

ToJSON ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ConditionValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ConditionValue = D1 (MetaData "ConditionValue" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ConditionValue'" PrefixI True) (S1 (MetaSel (Just "_cvRelativeDate") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConditionValueRelativeDate)) :*: S1 (MetaSel (Just "_cvUserEnteredValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

conditionValue :: ConditionValue Source #

Creates a value of ConditionValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cvRelativeDate :: Lens' ConditionValue (Maybe ConditionValueRelativeDate) Source #

A relative date (based on the current date). Valid only if the type is DATE_BEFORE, DATE_AFTER, DATE_ON_OR_BEFORE or DATE_ON_OR_AFTER. Relative dates are not supported in data validation. They are supported only in conditional formatting and conditional filters.

cvUserEnteredValue :: Lens' ConditionValue (Maybe Text) Source #

A value the condition is based on. The value is parsed as if the user typed into a cell. Formulas are supported (and must begin with an `=` or a '+').

DeleteDimensionRequest

data DeleteDimensionRequest Source #

Deletes the dimensions from the sheet.

See: deleteDimensionRequest smart constructor.

Instances
Eq DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteDimensionRequest -> c DeleteDimensionRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteDimensionRequest #

toConstr :: DeleteDimensionRequest -> Constr #

dataTypeOf :: DeleteDimensionRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteDimensionRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteDimensionRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteDimensionRequest -> DeleteDimensionRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDimensionRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDimensionRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteDimensionRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteDimensionRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteDimensionRequest -> m DeleteDimensionRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDimensionRequest -> m DeleteDimensionRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDimensionRequest -> m DeleteDimensionRequest #

Show DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteDimensionRequest :: Type -> Type #

ToJSON DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionRequest = D1 (MetaData "DeleteDimensionRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteDimensionRequest'" PrefixI True) (S1 (MetaSel (Just "_ddrRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DimensionRange))))

deleteDimensionRequest :: DeleteDimensionRequest Source #

Creates a value of DeleteDimensionRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ddrRange :: Lens' DeleteDimensionRequest (Maybe DimensionRange) Source #

The dimensions to delete from the sheet.

ClearValuesRequest

data ClearValuesRequest Source #

The request for clearing a range of values in a spreadsheet.

See: clearValuesRequest smart constructor.

Instances
Eq ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ClearValuesRequest -> c ClearValuesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ClearValuesRequest #

toConstr :: ClearValuesRequest -> Constr #

dataTypeOf :: ClearValuesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ClearValuesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ClearValuesRequest) #

gmapT :: (forall b. Data b => b -> b) -> ClearValuesRequest -> ClearValuesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ClearValuesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ClearValuesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> ClearValuesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ClearValuesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ClearValuesRequest -> m ClearValuesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ClearValuesRequest -> m ClearValuesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ClearValuesRequest -> m ClearValuesRequest #

Show ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ClearValuesRequest :: Type -> Type #

ToJSON ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ClearValuesRequest = D1 (MetaData "ClearValuesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ClearValuesRequest'" PrefixI False) (U1 :: Type -> Type))

clearValuesRequest :: ClearValuesRequest Source #

Creates a value of ClearValuesRequest with the minimum fields required to make a request.

FindReplaceRequest

data FindReplaceRequest Source #

Finds and replaces data in cells over a range, sheet, or all sheets.

See: findReplaceRequest smart constructor.

Instances
Eq FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FindReplaceRequest -> c FindReplaceRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FindReplaceRequest #

toConstr :: FindReplaceRequest -> Constr #

dataTypeOf :: FindReplaceRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FindReplaceRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FindReplaceRequest) #

gmapT :: (forall b. Data b => b -> b) -> FindReplaceRequest -> FindReplaceRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FindReplaceRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FindReplaceRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> FindReplaceRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FindReplaceRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FindReplaceRequest -> m FindReplaceRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FindReplaceRequest -> m FindReplaceRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FindReplaceRequest -> m FindReplaceRequest #

Show FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep FindReplaceRequest :: Type -> Type #

ToJSON FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FindReplaceRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

findReplaceRequest :: FindReplaceRequest Source #

Creates a value of FindReplaceRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

frrMatchCase :: Lens' FindReplaceRequest (Maybe Bool) Source #

True if the search is case sensitive.

frrAllSheets :: Lens' FindReplaceRequest (Maybe Bool) Source #

True to find/replace over all sheets.

frrIncludeFormulas :: Lens' FindReplaceRequest (Maybe Bool) Source #

True if the search should include cells with formulas. False to skip cells with formulas.

frrMatchEntireCell :: Lens' FindReplaceRequest (Maybe Bool) Source #

True if the find value should match the entire cell.

frrRange :: Lens' FindReplaceRequest (Maybe GridRange) Source #

The range to find/replace over.

frrSheetId :: Lens' FindReplaceRequest (Maybe Int32) Source #

The sheet to find/replace over.

frrFind :: Lens' FindReplaceRequest (Maybe Text) Source #

The value to search.

frrSearchByRegex :: Lens' FindReplaceRequest (Maybe Bool) Source #

True if the find value is a regex. The regular expression and replacement should follow Java regex rules at https://docs.oracle.com/javase/8/docs/api/java/util/regex/Pattern.html. The replacement string is allowed to refer to capturing groups. For example, if one cell has the contents `"Google Sheets"` and another has `"Google Docs"`, then searching for `"o.* (.*)"` with a replacement of `"$1 Rocks"` would change the contents of the cells to `"GSheets Rocks"` and `"GDocs Rocks"` respectively.

frrReplacement :: Lens' FindReplaceRequest (Maybe Text) Source #

The value to use as the replacement.

MoveDimensionRequest

data MoveDimensionRequest Source #

Moves one or more rows or columns.

See: moveDimensionRequest smart constructor.

Instances
Eq MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MoveDimensionRequest -> c MoveDimensionRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MoveDimensionRequest #

toConstr :: MoveDimensionRequest -> Constr #

dataTypeOf :: MoveDimensionRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MoveDimensionRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MoveDimensionRequest) #

gmapT :: (forall b. Data b => b -> b) -> MoveDimensionRequest -> MoveDimensionRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MoveDimensionRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MoveDimensionRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> MoveDimensionRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MoveDimensionRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MoveDimensionRequest -> m MoveDimensionRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MoveDimensionRequest -> m MoveDimensionRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MoveDimensionRequest -> m MoveDimensionRequest #

Show MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep MoveDimensionRequest :: Type -> Type #

ToJSON MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MoveDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MoveDimensionRequest = D1 (MetaData "MoveDimensionRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "MoveDimensionRequest'" PrefixI True) (S1 (MetaSel (Just "_mdrDestinationIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_mdrSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRange))))

moveDimensionRequest :: MoveDimensionRequest Source #

Creates a value of MoveDimensionRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mdrDestinationIndex :: Lens' MoveDimensionRequest (Maybe Int32) Source #

The zero-based start index of where to move the source data to, based on the coordinates *before* the source data is removed from the grid. Existing data will be shifted down or right (depending on the dimension) to make room for the moved dimensions. The source dimensions are removed from the grid, so the the data may end up in a different index than specified. For example, given `A1..A5` of `0, 1, 2, 3, 4` and wanting to move `"1"` and `"2"` to between `"3"` and `"4"`, the source would be `ROWS [1..3)`,and the destination index would be `"4"` (the zero-based index of row 5). The end result would be `A1..A5` of `0, 3, 1, 2, 4`.

mdrSource :: Lens' MoveDimensionRequest (Maybe DimensionRange) Source #

The source dimensions to move.

BatchGetValuesByDataFilterRequest

data BatchGetValuesByDataFilterRequest Source #

The request for retrieving a range of values in a spreadsheet selected by a set of DataFilters.

See: batchGetValuesByDataFilterRequest smart constructor.

Instances
Eq BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchGetValuesByDataFilterRequest -> c BatchGetValuesByDataFilterRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchGetValuesByDataFilterRequest #

toConstr :: BatchGetValuesByDataFilterRequest -> Constr #

dataTypeOf :: BatchGetValuesByDataFilterRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchGetValuesByDataFilterRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchGetValuesByDataFilterRequest) #

gmapT :: (forall b. Data b => b -> b) -> BatchGetValuesByDataFilterRequest -> BatchGetValuesByDataFilterRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequest -> m BatchGetValuesByDataFilterRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequest -> m BatchGetValuesByDataFilterRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequest -> m BatchGetValuesByDataFilterRequest #

Show BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchGetValuesByDataFilterRequest :: Type -> Type #

ToJSON BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesByDataFilterRequest = D1 (MetaData "BatchGetValuesByDataFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchGetValuesByDataFilterRequest'" PrefixI True) ((S1 (MetaSel (Just "_bgvbdfrValueRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchGetValuesByDataFilterRequestValueRenderOption)) :*: S1 (MetaSel (Just "_bgvbdfrDataFilters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilter]))) :*: (S1 (MetaSel (Just "_bgvbdfrDateTimeRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchGetValuesByDataFilterRequestDateTimeRenderOption)) :*: S1 (MetaSel (Just "_bgvbdfrMajorDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchGetValuesByDataFilterRequestMajorDimension)))))

batchGetValuesByDataFilterRequest :: BatchGetValuesByDataFilterRequest Source #

Creates a value of BatchGetValuesByDataFilterRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bgvbdfrValueRenderOption :: Lens' BatchGetValuesByDataFilterRequest (Maybe BatchGetValuesByDataFilterRequestValueRenderOption) Source #

How values should be represented in the output. The default render option is ValueRenderOption.FORMATTED_VALUE.

bgvbdfrDataFilters :: Lens' BatchGetValuesByDataFilterRequest [DataFilter] Source #

The data filters used to match the ranges of values to retrieve. Ranges that match any of the specified data filters will be included in the response.

bgvbdfrDateTimeRenderOption :: Lens' BatchGetValuesByDataFilterRequest (Maybe BatchGetValuesByDataFilterRequestDateTimeRenderOption) Source #

How dates, times, and durations should be represented in the output. This is ignored if value_render_option is FORMATTED_VALUE. The default dateTime render option is [DateTimeRenderOption.SERIAL_NUMBER].

bgvbdfrMajorDimension :: Lens' BatchGetValuesByDataFilterRequest (Maybe BatchGetValuesByDataFilterRequestMajorDimension) Source #

The major dimension that results should use. For example, if the spreadsheet data is: `A1=1,B1=2,A2=3,B2=4`, then a request that selects that range and sets `majorDimension=ROWS` will return `[[1,2],[3,4]]`, whereas a request that sets `majorDimension=COLUMNS` will return `[[1,3],[2,4]]`.

CellFormatVerticalAlignment

data CellFormatVerticalAlignment Source #

The vertical alignment of the value in the cell.

Constructors

VerticalAlignUnspecified

VERTICAL_ALIGN_UNSPECIFIED The vertical alignment is not specified. Do not use this.

Top

TOP The text is explicitly aligned to the top of the cell.

Middle

MIDDLE The text is explicitly aligned to the middle of the cell.

Bottom

BOTTOM The text is explicitly aligned to the bottom of the cell.

Instances
Enum CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellFormatVerticalAlignment -> c CellFormatVerticalAlignment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellFormatVerticalAlignment #

toConstr :: CellFormatVerticalAlignment -> Constr #

dataTypeOf :: CellFormatVerticalAlignment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellFormatVerticalAlignment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellFormatVerticalAlignment) #

gmapT :: (forall b. Data b => b -> b) -> CellFormatVerticalAlignment -> CellFormatVerticalAlignment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatVerticalAlignment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatVerticalAlignment -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellFormatVerticalAlignment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellFormatVerticalAlignment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellFormatVerticalAlignment -> m CellFormatVerticalAlignment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatVerticalAlignment -> m CellFormatVerticalAlignment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatVerticalAlignment -> m CellFormatVerticalAlignment #

Ord CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CellFormatVerticalAlignment :: Type -> Type #

Hashable CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatVerticalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatVerticalAlignment = D1 (MetaData "CellFormatVerticalAlignment" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "VerticalAlignUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Top" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Middle" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Bottom" PrefixI False) (U1 :: Type -> Type)))

NumberFormatType

data NumberFormatType Source #

The type of the number format. When writing, this field must be set.

Constructors

NumberFormatTypeUnspecified

NUMBER_FORMAT_TYPE_UNSPECIFIED The number format is not specified and is based on the contents of the cell. Do not explicitly use this.

Text

TEXT Text formatting, e.g `1000.12`

Number

NUMBER Number formatting, e.g, `1,000.12`

Percent

PERCENT Percent formatting, e.g `10.12%`

Currency

CURRENCY Currency formatting, e.g `$1,000.12`

Date

DATE Date formatting, e.g `9/26/2008`

Time

TIME Time formatting, e.g `3:59:00 PM`

DateTime

DATE_TIME Date+Time formatting, e.g `9/26/08 15:59:00`

Scientific

SCIENTIFIC Scientific number formatting, e.g `1.01E+03`

Instances
Enum NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NumberFormatType -> c NumberFormatType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NumberFormatType #

toConstr :: NumberFormatType -> Constr #

dataTypeOf :: NumberFormatType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NumberFormatType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NumberFormatType) #

gmapT :: (forall b. Data b => b -> b) -> NumberFormatType -> NumberFormatType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NumberFormatType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NumberFormatType -> r #

gmapQ :: (forall d. Data d => d -> u) -> NumberFormatType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NumberFormatType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NumberFormatType -> m NumberFormatType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NumberFormatType -> m NumberFormatType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NumberFormatType -> m NumberFormatType #

Ord NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep NumberFormatType :: Type -> Type #

Hashable NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep NumberFormatType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep NumberFormatType = D1 (MetaData "NumberFormatType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "NumberFormatTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Text" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Number" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Percent" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Currency" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Date" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Time" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DateTime" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Scientific" PrefixI False) (U1 :: Type -> Type)))))

GradientRule

data GradientRule Source #

A rule that applies a gradient color scale format, based on the interpolation points listed. The format of a cell will vary based on its contents as compared to the values of the interpolation points.

See: gradientRule smart constructor.

Instances
Eq GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GradientRule -> c GradientRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GradientRule #

toConstr :: GradientRule -> Constr #

dataTypeOf :: GradientRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GradientRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GradientRule) #

gmapT :: (forall b. Data b => b -> b) -> GradientRule -> GradientRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GradientRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GradientRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> GradientRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GradientRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GradientRule -> m GradientRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GradientRule -> m GradientRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GradientRule -> m GradientRule #

Show GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GradientRule :: Type -> Type #

ToJSON GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GradientRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GradientRule = D1 (MetaData "GradientRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GradientRule'" PrefixI True) (S1 (MetaSel (Just "_grMidpoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InterpolationPoint)) :*: (S1 (MetaSel (Just "_grMaxpoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InterpolationPoint)) :*: S1 (MetaSel (Just "_grMinpoint") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InterpolationPoint)))))

gradientRule :: GradientRule Source #

Creates a value of GradientRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

grMidpoint :: Lens' GradientRule (Maybe InterpolationPoint) Source #

An optional midway interpolation point.

grMaxpoint :: Lens' GradientRule (Maybe InterpolationPoint) Source #

The final interpolation point.

grMinpoint :: Lens' GradientRule (Maybe InterpolationPoint) Source #

The starting interpolation point.

CutPasteRequest

data CutPasteRequest Source #

Moves data from the source to the destination.

See: cutPasteRequest smart constructor.

Instances
Eq CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CutPasteRequest -> c CutPasteRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CutPasteRequest #

toConstr :: CutPasteRequest -> Constr #

dataTypeOf :: CutPasteRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CutPasteRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CutPasteRequest) #

gmapT :: (forall b. Data b => b -> b) -> CutPasteRequest -> CutPasteRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CutPasteRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CutPasteRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> CutPasteRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CutPasteRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CutPasteRequest -> m CutPasteRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CutPasteRequest -> m CutPasteRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CutPasteRequest -> m CutPasteRequest #

Show CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CutPasteRequest :: Type -> Type #

ToJSON CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CutPasteRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CutPasteRequest = D1 (MetaData "CutPasteRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CutPasteRequest'" PrefixI True) (S1 (MetaSel (Just "_cDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridCoordinate)) :*: (S1 (MetaSel (Just "_cSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_cPasteType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CutPasteRequestPasteType)))))

cutPasteRequest :: CutPasteRequest Source #

Creates a value of CutPasteRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cDestination :: Lens' CutPasteRequest (Maybe GridCoordinate) Source #

The top-left coordinate where the data should be pasted.

cSource :: Lens' CutPasteRequest (Maybe GridRange) Source #

The source data to cut.

cPasteType :: Lens' CutPasteRequest (Maybe CutPasteRequestPasteType) Source #

What kind of data to paste. All the source data will be cut, regardless of what is pasted.

UpdateEmbeddedObjectPositionResponse

data UpdateEmbeddedObjectPositionResponse Source #

The result of updating an embedded object's position.

See: updateEmbeddedObjectPositionResponse smart constructor.

Instances
Eq UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateEmbeddedObjectPositionResponse -> c UpdateEmbeddedObjectPositionResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateEmbeddedObjectPositionResponse #

toConstr :: UpdateEmbeddedObjectPositionResponse -> Constr #

dataTypeOf :: UpdateEmbeddedObjectPositionResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateEmbeddedObjectPositionResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateEmbeddedObjectPositionResponse) #

gmapT :: (forall b. Data b => b -> b) -> UpdateEmbeddedObjectPositionResponse -> UpdateEmbeddedObjectPositionResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateEmbeddedObjectPositionResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateEmbeddedObjectPositionResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateEmbeddedObjectPositionResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateEmbeddedObjectPositionResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateEmbeddedObjectPositionResponse -> m UpdateEmbeddedObjectPositionResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateEmbeddedObjectPositionResponse -> m UpdateEmbeddedObjectPositionResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateEmbeddedObjectPositionResponse -> m UpdateEmbeddedObjectPositionResponse #

Show UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateEmbeddedObjectPositionResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateEmbeddedObjectPositionResponse = D1 (MetaData "UpdateEmbeddedObjectPositionResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "UpdateEmbeddedObjectPositionResponse'" PrefixI True) (S1 (MetaSel (Just "_ueoprPosition") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe EmbeddedObjectPosition))))

updateEmbeddedObjectPositionResponse :: UpdateEmbeddedObjectPositionResponse Source #

Creates a value of UpdateEmbeddedObjectPositionResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ConditionValueRelativeDate

data ConditionValueRelativeDate Source #

A relative date (based on the current date). Valid only if the type is DATE_BEFORE, DATE_AFTER, DATE_ON_OR_BEFORE or DATE_ON_OR_AFTER. Relative dates are not supported in data validation. They are supported only in conditional formatting and conditional filters.

Constructors

RelativeDateUnspecified

RELATIVE_DATE_UNSPECIFIED Default value, do not use.

PastYear

PAST_YEAR The value is one year before today.

PastMonth

PAST_MONTH The value is one month before today.

PastWeek

PAST_WEEK The value is one week before today.

Yesterday

YESTERDAY The value is yesterday.

Today

TODAY The value is today.

Tomorrow

TOMORROW The value is tomorrow.

Instances
Enum ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConditionValueRelativeDate -> c ConditionValueRelativeDate #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConditionValueRelativeDate #

toConstr :: ConditionValueRelativeDate -> Constr #

dataTypeOf :: ConditionValueRelativeDate -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConditionValueRelativeDate) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConditionValueRelativeDate) #

gmapT :: (forall b. Data b => b -> b) -> ConditionValueRelativeDate -> ConditionValueRelativeDate #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConditionValueRelativeDate -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConditionValueRelativeDate -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConditionValueRelativeDate -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConditionValueRelativeDate -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConditionValueRelativeDate -> m ConditionValueRelativeDate #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionValueRelativeDate -> m ConditionValueRelativeDate #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionValueRelativeDate -> m ConditionValueRelativeDate #

Ord ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep ConditionValueRelativeDate :: Type -> Type #

Hashable ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ConditionValueRelativeDate Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ConditionValueRelativeDate = D1 (MetaData "ConditionValueRelativeDate" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "RelativeDateUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PastYear" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PastMonth" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PastWeek" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Yesterday" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Today" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Tomorrow" PrefixI False) (U1 :: Type -> Type))))

WaterfallChartCustomSubtotal

data WaterfallChartCustomSubtotal Source #

A custom subtotal column for a waterfall chart series.

See: waterfallChartCustomSubtotal smart constructor.

Instances
Eq WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartCustomSubtotal -> c WaterfallChartCustomSubtotal #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartCustomSubtotal #

toConstr :: WaterfallChartCustomSubtotal -> Constr #

dataTypeOf :: WaterfallChartCustomSubtotal -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartCustomSubtotal) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartCustomSubtotal) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartCustomSubtotal -> WaterfallChartCustomSubtotal #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartCustomSubtotal -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartCustomSubtotal -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartCustomSubtotal -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartCustomSubtotal -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartCustomSubtotal -> m WaterfallChartCustomSubtotal #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartCustomSubtotal -> m WaterfallChartCustomSubtotal #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartCustomSubtotal -> m WaterfallChartCustomSubtotal #

Show WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep WaterfallChartCustomSubtotal :: Type -> Type #

ToJSON WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartCustomSubtotal Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartCustomSubtotal = D1 (MetaData "WaterfallChartCustomSubtotal" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WaterfallChartCustomSubtotal'" PrefixI True) (S1 (MetaSel (Just "_wccsDataIsSubtotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_wccsSubtotalIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_wccsLabel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

waterfallChartCustomSubtotal :: WaterfallChartCustomSubtotal Source #

Creates a value of WaterfallChartCustomSubtotal with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wccsDataIsSubtotal :: Lens' WaterfallChartCustomSubtotal (Maybe Bool) Source #

True if the data point at subtotal_index is the subtotal. If false, the subtotal will be computed and appear after the data point.

wccsSubtotalIndex :: Lens' WaterfallChartCustomSubtotal (Maybe Int32) Source #

The 0-based index of a data point within the series. If data_is_subtotal is true, the data point at this index is the subtotal. Otherwise, the subtotal appears after the data point with this index. A series can have multiple subtotals at arbitrary indices, but subtotals do not affect the indices of the data points. For example, if a series has three data points, their indices will always be 0, 1, and 2, regardless of how many subtotals exist on the series or what data points they are associated with.

wccsLabel :: Lens' WaterfallChartCustomSubtotal (Maybe Text) Source #

A label for the subtotal column.

DeveloperMetadataLocationLocationType

data DeveloperMetadataLocationLocationType Source #

The type of location this object represents. This field is read-only.

Constructors

DMLLTDeveloperMetadataLocationTypeUnspecified

DEVELOPER_METADATA_LOCATION_TYPE_UNSPECIFIED Default value.

DMLLTRow

ROW Developer metadata associated on an entire row dimension.

DMLLTColumn

COLUMN Developer metadata associated on an entire column dimension.

DMLLTSheet

SHEET Developer metadata associated on an entire sheet.

DMLLTSpreadsheet

SPREADSHEET Developer metadata associated on the entire spreadsheet.

Instances
Enum DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadataLocationLocationType -> c DeveloperMetadataLocationLocationType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadataLocationLocationType #

toConstr :: DeveloperMetadataLocationLocationType -> Constr #

dataTypeOf :: DeveloperMetadataLocationLocationType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadataLocationLocationType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadataLocationLocationType) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadataLocationLocationType -> DeveloperMetadataLocationLocationType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLocationLocationType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLocationLocationType -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadataLocationLocationType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadataLocationLocationType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocationLocationType -> m DeveloperMetadataLocationLocationType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocationLocationType -> m DeveloperMetadataLocationLocationType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocationLocationType -> m DeveloperMetadataLocationLocationType #

Ord DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLocationLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLocationLocationType = D1 (MetaData "DeveloperMetadataLocationLocationType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "DMLLTDeveloperMetadataLocationTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DMLLTRow" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DMLLTColumn" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DMLLTSheet" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DMLLTSpreadsheet" PrefixI False) (U1 :: Type -> Type))))

Response

data Response Source #

A single response from an update.

See: response smart constructor.

Instances
Eq Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Response -> c Response #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Response #

toConstr :: Response -> Constr #

dataTypeOf :: Response -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Response) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Response) #

gmapT :: (forall b. Data b => b -> b) -> Response -> Response #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Response -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Response -> r #

gmapQ :: (forall d. Data d => d -> u) -> Response -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Response -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Response -> m Response #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Response -> m Response #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Response -> m Response #

Show Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Response :: Type -> Type #

Methods

from :: Response -> Rep Response x #

to :: Rep Response x -> Response #

ToJSON Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Response Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Response = D1 (MetaData "Response" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Response'" PrefixI True) ((((S1 (MetaSel (Just "_rAddFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddFilterViewResponse)) :*: S1 (MetaSel (Just "_rCreateDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CreateDeveloperMetadataResponse))) :*: (S1 (MetaSel (Just "_rDuplicateFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DuplicateFilterViewResponse)) :*: S1 (MetaSel (Just "_rUpdateEmbeddedObjectPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateEmbeddedObjectPositionResponse)))) :*: ((S1 (MetaSel (Just "_rDeleteDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteDimensionGroupResponse)) :*: S1 (MetaSel (Just "_rAddSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddSheetResponse))) :*: (S1 (MetaSel (Just "_rFindReplace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FindReplaceResponse)) :*: S1 (MetaSel (Just "_rAddProtectedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddProtectedRangeResponse))))) :*: (((S1 (MetaSel (Just "_rDeleteConditionalFormatRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteConditionalFormatRuleResponse)) :*: S1 (MetaSel (Just "_rUpdateConditionalFormatRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateConditionalFormatRuleResponse))) :*: (S1 (MetaSel (Just "_rDeleteDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteDeveloperMetadataResponse)) :*: S1 (MetaSel (Just "_rUpdateDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateDeveloperMetadataResponse)))) :*: ((S1 (MetaSel (Just "_rAddNamedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddNamedRangeResponse)) :*: S1 (MetaSel (Just "_rAddChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddChartResponse))) :*: (S1 (MetaSel (Just "_rAddBanding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddBandingResponse)) :*: (S1 (MetaSel (Just "_rDuplicateSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DuplicateSheetResponse)) :*: S1 (MetaSel (Just "_rAddDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddDimensionGroupResponse))))))))

rAddFilterView :: Lens' Response (Maybe AddFilterViewResponse) Source #

A reply from adding a filter view.

rCreateDeveloperMetadata :: Lens' Response (Maybe CreateDeveloperMetadataResponse) Source #

A reply from creating a developer metadata entry.

rDuplicateFilterView :: Lens' Response (Maybe DuplicateFilterViewResponse) Source #

A reply from duplicating a filter view.

rUpdateEmbeddedObjectPosition :: Lens' Response (Maybe UpdateEmbeddedObjectPositionResponse) Source #

A reply from updating an embedded object's position.

rDeleteDimensionGroup :: Lens' Response (Maybe DeleteDimensionGroupResponse) Source #

A reply from deleting a dimension group.

rAddSheet :: Lens' Response (Maybe AddSheetResponse) Source #

A reply from adding a sheet.

rFindReplace :: Lens' Response (Maybe FindReplaceResponse) Source #

A reply from doing a find/replace.

rAddProtectedRange :: Lens' Response (Maybe AddProtectedRangeResponse) Source #

A reply from adding a protected range.

rDeleteConditionalFormatRule :: Lens' Response (Maybe DeleteConditionalFormatRuleResponse) Source #

A reply from deleting a conditional format rule.

rUpdateConditionalFormatRule :: Lens' Response (Maybe UpdateConditionalFormatRuleResponse) Source #

A reply from updating a conditional format rule.

rDeleteDeveloperMetadata :: Lens' Response (Maybe DeleteDeveloperMetadataResponse) Source #

A reply from deleting a developer metadata entry.

rUpdateDeveloperMetadata :: Lens' Response (Maybe UpdateDeveloperMetadataResponse) Source #

A reply from updating a developer metadata entry.

rAddNamedRange :: Lens' Response (Maybe AddNamedRangeResponse) Source #

A reply from adding a named range.

rAddChart :: Lens' Response (Maybe AddChartResponse) Source #

A reply from adding a chart.

rAddBanding :: Lens' Response (Maybe AddBandingResponse) Source #

A reply from adding a banded range.

rDuplicateSheet :: Lens' Response (Maybe DuplicateSheetResponse) Source #

A reply from duplicating a sheet.

rAddDimensionGroup :: Lens' Response (Maybe AddDimensionGroupResponse) Source #

A reply from adding a dimension group.

FilterCriteria

data FilterCriteria Source #

Criteria for showing/hiding rows in a filter or filter view.

See: filterCriteria smart constructor.

Instances
Eq FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FilterCriteria -> c FilterCriteria #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FilterCriteria #

toConstr :: FilterCriteria -> Constr #

dataTypeOf :: FilterCriteria -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FilterCriteria) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterCriteria) #

gmapT :: (forall b. Data b => b -> b) -> FilterCriteria -> FilterCriteria #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FilterCriteria -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FilterCriteria -> r #

gmapQ :: (forall d. Data d => d -> u) -> FilterCriteria -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FilterCriteria -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FilterCriteria -> m FilterCriteria #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterCriteria -> m FilterCriteria #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterCriteria -> m FilterCriteria #

Show FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep FilterCriteria :: Type -> Type #

ToJSON FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FilterCriteria = D1 (MetaData "FilterCriteria" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "FilterCriteria'" PrefixI True) (S1 (MetaSel (Just "_fcHiddenValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_fcCondition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BooleanCondition))))

filterCriteria :: FilterCriteria Source #

Creates a value of FilterCriteria with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

fcHiddenValues :: Lens' FilterCriteria [Text] Source #

Values that should be hidden.

fcCondition :: Lens' FilterCriteria (Maybe BooleanCondition) Source #

A condition that must be true for values to be shown. (This does not override hiddenValues -- if a value is listed there, it will still be hidden.)

ErrorValue

data ErrorValue Source #

An error in a cell.

See: errorValue smart constructor.

Instances
Eq ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrorValue -> c ErrorValue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ErrorValue #

toConstr :: ErrorValue -> Constr #

dataTypeOf :: ErrorValue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ErrorValue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ErrorValue) #

gmapT :: (forall b. Data b => b -> b) -> ErrorValue -> ErrorValue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrorValue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrorValue -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrorValue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrorValue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrorValue -> m ErrorValue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorValue -> m ErrorValue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorValue -> m ErrorValue #

Show ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ErrorValue :: Type -> Type #

ToJSON ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ErrorValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ErrorValue = D1 (MetaData "ErrorValue" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ErrorValue'" PrefixI True) (S1 (MetaSel (Just "_evType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ErrorValueType)) :*: S1 (MetaSel (Just "_evMessage") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

errorValue :: ErrorValue Source #

Creates a value of ErrorValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

evMessage :: Lens' ErrorValue (Maybe Text) Source #

A message with more information about the error (in the spreadsheet's locale).

UpdateConditionalFormatRuleRequest

data UpdateConditionalFormatRuleRequest Source #

Updates a conditional format rule at the given index, or moves a conditional format rule to another index.

See: updateConditionalFormatRuleRequest smart constructor.

Instances
Eq UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateConditionalFormatRuleRequest -> c UpdateConditionalFormatRuleRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateConditionalFormatRuleRequest #

toConstr :: UpdateConditionalFormatRuleRequest -> Constr #

dataTypeOf :: UpdateConditionalFormatRuleRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateConditionalFormatRuleRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateConditionalFormatRuleRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateConditionalFormatRuleRequest -> UpdateConditionalFormatRuleRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateConditionalFormatRuleRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateConditionalFormatRuleRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateConditionalFormatRuleRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateConditionalFormatRuleRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleRequest -> m UpdateConditionalFormatRuleRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleRequest -> m UpdateConditionalFormatRuleRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleRequest -> m UpdateConditionalFormatRuleRequest #

Show UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateConditionalFormatRuleRequest :: Type -> Type #

ToJSON UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateConditionalFormatRuleRequest = D1 (MetaData "UpdateConditionalFormatRuleRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateConditionalFormatRuleRequest'" PrefixI True) ((S1 (MetaSel (Just "_ucfrrRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConditionalFormatRule)) :*: S1 (MetaSel (Just "_ucfrrNewIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_ucfrrSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_ucfrrIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

updateConditionalFormatRuleRequest :: UpdateConditionalFormatRuleRequest Source #

Creates a value of UpdateConditionalFormatRuleRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ucfrrRule :: Lens' UpdateConditionalFormatRuleRequest (Maybe ConditionalFormatRule) Source #

The rule that should replace the rule at the given index.

ucfrrNewIndex :: Lens' UpdateConditionalFormatRuleRequest (Maybe Int32) Source #

The zero-based new index the rule should end up at.

ucfrrSheetId :: Lens' UpdateConditionalFormatRuleRequest (Maybe Int32) Source #

The sheet of the rule to move. Required if new_index is set, unused otherwise.

ucfrrIndex :: Lens' UpdateConditionalFormatRuleRequest (Maybe Int32) Source #

The zero-based index of the rule that should be replaced or moved.

DeleteConditionalFormatRuleRequest

data DeleteConditionalFormatRuleRequest Source #

Deletes a conditional format rule at the given index. All subsequent rules' indexes are decremented.

See: deleteConditionalFormatRuleRequest smart constructor.

Instances
Eq DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteConditionalFormatRuleRequest -> c DeleteConditionalFormatRuleRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteConditionalFormatRuleRequest #

toConstr :: DeleteConditionalFormatRuleRequest -> Constr #

dataTypeOf :: DeleteConditionalFormatRuleRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteConditionalFormatRuleRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteConditionalFormatRuleRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteConditionalFormatRuleRequest -> DeleteConditionalFormatRuleRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteConditionalFormatRuleRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteConditionalFormatRuleRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteConditionalFormatRuleRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteConditionalFormatRuleRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleRequest -> m DeleteConditionalFormatRuleRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleRequest -> m DeleteConditionalFormatRuleRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleRequest -> m DeleteConditionalFormatRuleRequest #

Show DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteConditionalFormatRuleRequest :: Type -> Type #

ToJSON DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteConditionalFormatRuleRequest = D1 (MetaData "DeleteConditionalFormatRuleRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeleteConditionalFormatRuleRequest'" PrefixI True) (S1 (MetaSel (Just "_dcfrrSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dcfrrIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

deleteConditionalFormatRuleRequest :: DeleteConditionalFormatRuleRequest Source #

Creates a value of DeleteConditionalFormatRuleRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dcfrrSheetId :: Lens' DeleteConditionalFormatRuleRequest (Maybe Int32) Source #

The sheet the rule is being deleted from.

dcfrrIndex :: Lens' DeleteConditionalFormatRuleRequest (Maybe Int32) Source #

The zero-based index of the rule to be deleted.

UpdateDeveloperMetadataRequest

data UpdateDeveloperMetadataRequest Source #

A request to update properties of developer metadata. Updates the properties of the developer metadata selected by the filters to the values provided in the DeveloperMetadata resource. Callers must specify the properties they wish to update in the fields parameter, as well as specify at least one DataFilter matching the metadata they wish to update.

See: updateDeveloperMetadataRequest smart constructor.

Instances
Eq UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateDeveloperMetadataRequest -> c UpdateDeveloperMetadataRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateDeveloperMetadataRequest #

toConstr :: UpdateDeveloperMetadataRequest -> Constr #

dataTypeOf :: UpdateDeveloperMetadataRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateDeveloperMetadataRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateDeveloperMetadataRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateDeveloperMetadataRequest -> UpdateDeveloperMetadataRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDeveloperMetadataRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDeveloperMetadataRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateDeveloperMetadataRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateDeveloperMetadataRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataRequest -> m UpdateDeveloperMetadataRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataRequest -> m UpdateDeveloperMetadataRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataRequest -> m UpdateDeveloperMetadataRequest #

Show UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateDeveloperMetadataRequest :: Type -> Type #

ToJSON UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDeveloperMetadataRequest = D1 (MetaData "UpdateDeveloperMetadataRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateDeveloperMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_udmrDataFilters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilter])) :*: (S1 (MetaSel (Just "_udmrDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadata)) :*: S1 (MetaSel (Just "_udmrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

updateDeveloperMetadataRequest :: UpdateDeveloperMetadataRequest Source #

Creates a value of UpdateDeveloperMetadataRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

udmrDataFilters :: Lens' UpdateDeveloperMetadataRequest [DataFilter] Source #

The filters matching the developer metadata entries to update.

udmrDeveloperMetadata :: Lens' UpdateDeveloperMetadataRequest (Maybe DeveloperMetadata) Source #

The value that all metadata matched by the data filters will be updated to.

udmrFields :: Lens' UpdateDeveloperMetadataRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `developerMetadata` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

SortSpecSortOrder

data SortSpecSortOrder Source #

The order data should be sorted.

Constructors

SortOrderUnspecified

SORT_ORDER_UNSPECIFIED Default value, do not use this.

Ascending

ASCENDING Sort ascending.

Descending

DESCENDING Sort descending.

Instances
Enum SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SortSpecSortOrder -> c SortSpecSortOrder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SortSpecSortOrder #

toConstr :: SortSpecSortOrder -> Constr #

dataTypeOf :: SortSpecSortOrder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SortSpecSortOrder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SortSpecSortOrder) #

gmapT :: (forall b. Data b => b -> b) -> SortSpecSortOrder -> SortSpecSortOrder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SortSpecSortOrder -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SortSpecSortOrder -> r #

gmapQ :: (forall d. Data d => d -> u) -> SortSpecSortOrder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SortSpecSortOrder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SortSpecSortOrder -> m SortSpecSortOrder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SortSpecSortOrder -> m SortSpecSortOrder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SortSpecSortOrder -> m SortSpecSortOrder #

Ord SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep SortSpecSortOrder :: Type -> Type #

Hashable SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SortSpecSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SortSpecSortOrder = D1 (MetaData "SortSpecSortOrder" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SortOrderUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Ascending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Descending" PrefixI False) (U1 :: Type -> Type)))

DeleteDeveloperMetadataRequest

data DeleteDeveloperMetadataRequest Source #

A request to delete developer metadata.

See: deleteDeveloperMetadataRequest smart constructor.

Instances
Eq DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteDeveloperMetadataRequest -> c DeleteDeveloperMetadataRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteDeveloperMetadataRequest #

toConstr :: DeleteDeveloperMetadataRequest -> Constr #

dataTypeOf :: DeleteDeveloperMetadataRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteDeveloperMetadataRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteDeveloperMetadataRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteDeveloperMetadataRequest -> DeleteDeveloperMetadataRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDeveloperMetadataRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDeveloperMetadataRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteDeveloperMetadataRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteDeveloperMetadataRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataRequest -> m DeleteDeveloperMetadataRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataRequest -> m DeleteDeveloperMetadataRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataRequest -> m DeleteDeveloperMetadataRequest #

Show DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteDeveloperMetadataRequest :: Type -> Type #

ToJSON DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDeveloperMetadataRequest = D1 (MetaData "DeleteDeveloperMetadataRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteDeveloperMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_ddmrDataFilter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DataFilter))))

deleteDeveloperMetadataRequest :: DeleteDeveloperMetadataRequest Source #

Creates a value of DeleteDeveloperMetadataRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ddmrDataFilter :: Lens' DeleteDeveloperMetadataRequest (Maybe DataFilter) Source #

The data filter describing the criteria used to select which developer metadata entry to delete.

WaterfallChartSpec

data WaterfallChartSpec Source #

A waterfall chart.

See: waterfallChartSpec smart constructor.

Instances
Eq WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartSpec -> c WaterfallChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartSpec #

toConstr :: WaterfallChartSpec -> Constr #

dataTypeOf :: WaterfallChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartSpec -> WaterfallChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartSpec -> m WaterfallChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSpec -> m WaterfallChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSpec -> m WaterfallChartSpec #

Show WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep WaterfallChartSpec :: Type -> Type #

ToJSON WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartSpec = D1 (MetaData "WaterfallChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WaterfallChartSpec'" PrefixI True) ((S1 (MetaSel (Just "_wcsStackedType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartSpecStackedType)) :*: (S1 (MetaSel (Just "_wcsConnectorLineStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LineStyle)) :*: S1 (MetaSel (Just "_wcsDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartDomain)))) :*: (S1 (MetaSel (Just "_wcsSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [WaterfallChartSeries])) :*: (S1 (MetaSel (Just "_wcsHideConnectorLines") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_wcsFirstValueIsTotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))))

waterfallChartSpec :: WaterfallChartSpec Source #

Creates a value of WaterfallChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wcsConnectorLineStyle :: Lens' WaterfallChartSpec (Maybe LineStyle) Source #

The line style for the connector lines.

wcsDomain :: Lens' WaterfallChartSpec (Maybe WaterfallChartDomain) Source #

The domain data (horizontal axis) for the waterfall chart.

wcsSeries :: Lens' WaterfallChartSpec [WaterfallChartSeries] Source #

The data this waterfall chart is visualizing.

wcsHideConnectorLines :: Lens' WaterfallChartSpec (Maybe Bool) Source #

True to hide connector lines between columns.

wcsFirstValueIsTotal :: Lens' WaterfallChartSpec (Maybe Bool) Source #

True to interpret the first value as a total.

OverlayPosition

data OverlayPosition Source #

The location an object is overlaid on top of a grid.

See: overlayPosition smart constructor.

Instances
Eq OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OverlayPosition -> c OverlayPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OverlayPosition #

toConstr :: OverlayPosition -> Constr #

dataTypeOf :: OverlayPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OverlayPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OverlayPosition) #

gmapT :: (forall b. Data b => b -> b) -> OverlayPosition -> OverlayPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OverlayPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OverlayPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> OverlayPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OverlayPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OverlayPosition -> m OverlayPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlayPosition -> m OverlayPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OverlayPosition -> m OverlayPosition #

Show OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep OverlayPosition :: Type -> Type #

ToJSON OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep OverlayPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep OverlayPosition = D1 (MetaData "OverlayPosition" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "OverlayPosition'" PrefixI True) ((S1 (MetaSel (Just "_opHeightPixels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_opOffSetYPixels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_opAnchorCell") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridCoordinate)) :*: (S1 (MetaSel (Just "_opWidthPixels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_opOffSetXPixels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

overlayPosition :: OverlayPosition Source #

Creates a value of OverlayPosition with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

opHeightPixels :: Lens' OverlayPosition (Maybe Int32) Source #

The height of the object, in pixels. Defaults to 371.

opOffSetYPixels :: Lens' OverlayPosition (Maybe Int32) Source #

The vertical offset, in pixels, that the object is offset from the anchor cell.

opAnchorCell :: Lens' OverlayPosition (Maybe GridCoordinate) Source #

The cell the object is anchored to.

opWidthPixels :: Lens' OverlayPosition (Maybe Int32) Source #

The width of the object, in pixels. Defaults to 600.

opOffSetXPixels :: Lens' OverlayPosition (Maybe Int32) Source #

The horizontal offset, in pixels, that the object is offset from the anchor cell.

DeleteEmbeddedObjectRequest

data DeleteEmbeddedObjectRequest Source #

Deletes the embedded object with the given ID.

See: deleteEmbeddedObjectRequest smart constructor.

Instances
Eq DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteEmbeddedObjectRequest -> c DeleteEmbeddedObjectRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteEmbeddedObjectRequest #

toConstr :: DeleteEmbeddedObjectRequest -> Constr #

dataTypeOf :: DeleteEmbeddedObjectRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteEmbeddedObjectRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteEmbeddedObjectRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteEmbeddedObjectRequest -> DeleteEmbeddedObjectRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteEmbeddedObjectRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteEmbeddedObjectRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteEmbeddedObjectRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteEmbeddedObjectRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteEmbeddedObjectRequest -> m DeleteEmbeddedObjectRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteEmbeddedObjectRequest -> m DeleteEmbeddedObjectRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteEmbeddedObjectRequest -> m DeleteEmbeddedObjectRequest #

Show DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteEmbeddedObjectRequest :: Type -> Type #

ToJSON DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteEmbeddedObjectRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteEmbeddedObjectRequest = D1 (MetaData "DeleteEmbeddedObjectRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteEmbeddedObjectRequest'" PrefixI True) (S1 (MetaSel (Just "_deorObjectId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

deleteEmbeddedObjectRequest :: DeleteEmbeddedObjectRequest Source #

Creates a value of DeleteEmbeddedObjectRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

deorObjectId :: Lens' DeleteEmbeddedObjectRequest (Maybe Int32) Source #

The ID of the embedded object to delete.

DeveloperMetadataLocation

data DeveloperMetadataLocation Source #

A location where metadata may be associated in a spreadsheet.

See: developerMetadataLocation smart constructor.

Instances
Eq DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadataLocation -> c DeveloperMetadataLocation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadataLocation #

toConstr :: DeveloperMetadataLocation -> Constr #

dataTypeOf :: DeveloperMetadataLocation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadataLocation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadataLocation) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadataLocation -> DeveloperMetadataLocation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLocation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLocation -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadataLocation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadataLocation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocation -> m DeveloperMetadataLocation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocation -> m DeveloperMetadataLocation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLocation -> m DeveloperMetadataLocation #

Show DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeveloperMetadataLocation :: Type -> Type #

ToJSON DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeveloperMetadataLocation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeveloperMetadataLocation = D1 (MetaData "DeveloperMetadataLocation" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeveloperMetadataLocation'" PrefixI True) ((S1 (MetaSel (Just "_dmlSpreadsheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dmlDimensionRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRange))) :*: (S1 (MetaSel (Just "_dmlSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dmlLocationType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadataLocationLocationType)))))

developerMetadataLocation :: DeveloperMetadataLocation Source #

Creates a value of DeveloperMetadataLocation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dmlSpreadsheet :: Lens' DeveloperMetadataLocation (Maybe Bool) Source #

True when metadata is associated with an entire spreadsheet.

dmlDimensionRange :: Lens' DeveloperMetadataLocation (Maybe DimensionRange) Source #

Represents the row or column when metadata is associated with a dimension. The specified DimensionRange must represent a single row or column; it cannot be unbounded or span multiple rows or columns.

dmlSheetId :: Lens' DeveloperMetadataLocation (Maybe Int32) Source #

The ID of the sheet when metadata is associated with an entire sheet.

dmlLocationType :: Lens' DeveloperMetadataLocation (Maybe DeveloperMetadataLocationLocationType) Source #

The type of location this object represents. This field is read-only.

SheetProperties

data SheetProperties Source #

Properties of a sheet.

See: sheetProperties smart constructor.

Instances
Eq SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SheetProperties -> c SheetProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SheetProperties #

toConstr :: SheetProperties -> Constr #

dataTypeOf :: SheetProperties -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SheetProperties) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SheetProperties) #

gmapT :: (forall b. Data b => b -> b) -> SheetProperties -> SheetProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SheetProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SheetProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> SheetProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SheetProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SheetProperties -> m SheetProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SheetProperties -> m SheetProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SheetProperties -> m SheetProperties #

Show SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SheetProperties :: Type -> Type #

ToJSON SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SheetProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

sheetProperties :: SheetProperties Source #

Creates a value of SheetProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sTabColor :: Lens' SheetProperties (Maybe Color) Source #

The color of the tab in the UI.

sGridProperties :: Lens' SheetProperties (Maybe GridProperties) Source #

Additional properties of the sheet if this sheet is a grid. (If the sheet is an object sheet, containing a chart or image, then this field will be absent.) When writing it is an error to set any grid properties on non-grid sheets.

sSheetType :: Lens' SheetProperties (Maybe SheetPropertiesSheetType) Source #

The type of sheet. Defaults to GRID. This field cannot be changed once set.

sHidden :: Lens' SheetProperties (Maybe Bool) Source #

True if the sheet is hidden in the UI, false if it's visible.

sSheetId :: Lens' SheetProperties (Maybe Int32) Source #

The ID of the sheet. Must be non-negative. This field cannot be changed once set.

sTitle :: Lens' SheetProperties (Maybe Text) Source #

The name of the sheet.

sRightToLeft :: Lens' SheetProperties (Maybe Bool) Source #

True if the sheet is an RTL sheet instead of an LTR sheet.

sIndex :: Lens' SheetProperties (Maybe Int32) Source #

The index of the sheet within the spreadsheet. When adding or updating sheet properties, if this field is excluded then the sheet is added or moved to the end of the sheet list. When updating sheet indices or inserting sheets, movement is considered in "before the move" indexes. For example, if there were 3 sheets (S1, S2, S3) in order to move S1 ahead of S2 the index would have to be set to 2. A sheet index update request is ignored if the requested index is identical to the sheets current index or if the requested new index is equal to the current sheet index + 1.

FilterViewCriteria

data FilterViewCriteria Source #

The criteria for showing/hiding values per column. The map's key is the column index, and the value is the criteria for that column.

See: filterViewCriteria smart constructor.

Instances
Eq FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> FilterViewCriteria -> c FilterViewCriteria #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c FilterViewCriteria #

toConstr :: FilterViewCriteria -> Constr #

dataTypeOf :: FilterViewCriteria -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c FilterViewCriteria) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c FilterViewCriteria) #

gmapT :: (forall b. Data b => b -> b) -> FilterViewCriteria -> FilterViewCriteria #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> FilterViewCriteria -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> FilterViewCriteria -> r #

gmapQ :: (forall d. Data d => d -> u) -> FilterViewCriteria -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> FilterViewCriteria -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> FilterViewCriteria -> m FilterViewCriteria #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterViewCriteria -> m FilterViewCriteria #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> FilterViewCriteria -> m FilterViewCriteria #

Show FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep FilterViewCriteria :: Type -> Type #

ToJSON FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FilterViewCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep FilterViewCriteria = D1 (MetaData "FilterViewCriteria" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "FilterViewCriteria'" PrefixI True) (S1 (MetaSel (Just "_fvcAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text FilterCriteria))))

filterViewCriteria Source #

Creates a value of FilterViewCriteria with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

BatchUpdateValuesResponse

data BatchUpdateValuesResponse Source #

The response when updating a range of values in a spreadsheet.

See: batchUpdateValuesResponse smart constructor.

Instances
Eq BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateValuesResponse -> c BatchUpdateValuesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateValuesResponse #

toConstr :: BatchUpdateValuesResponse -> Constr #

dataTypeOf :: BatchUpdateValuesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateValuesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateValuesResponse) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateValuesResponse -> BatchUpdateValuesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateValuesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateValuesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateValuesResponse -> m BatchUpdateValuesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesResponse -> m BatchUpdateValuesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesResponse -> m BatchUpdateValuesResponse #

Show BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchUpdateValuesResponse :: Type -> Type #

ToJSON BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesResponse = D1 (MetaData "BatchUpdateValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateValuesResponse'" PrefixI True) ((S1 (MetaSel (Just "_buvrTotalUpdatedColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_buvrResponses") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [UpdateValuesResponse])) :*: S1 (MetaSel (Just "_buvrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_buvrTotalUpdatedSheets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_buvrTotalUpdatedCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_buvrTotalUpdatedRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

batchUpdateValuesResponse :: BatchUpdateValuesResponse Source #

Creates a value of BatchUpdateValuesResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

buvrTotalUpdatedColumns :: Lens' BatchUpdateValuesResponse (Maybe Int32) Source #

The total number of columns where at least one cell in the column was updated.

buvrResponses :: Lens' BatchUpdateValuesResponse [UpdateValuesResponse] Source #

One UpdateValuesResponse per requested range, in the same order as the requests appeared.

buvrSpreadsheetId :: Lens' BatchUpdateValuesResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

buvrTotalUpdatedSheets :: Lens' BatchUpdateValuesResponse (Maybe Int32) Source #

The total number of sheets where at least one cell in the sheet was updated.

buvrTotalUpdatedRows :: Lens' BatchUpdateValuesResponse (Maybe Int32) Source #

The total number of rows where at least one cell in the row was updated.

UpdateSheetPropertiesRequest

data UpdateSheetPropertiesRequest Source #

Updates properties of the sheet with the specified sheetId.

See: updateSheetPropertiesRequest smart constructor.

Instances
Eq UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateSheetPropertiesRequest -> c UpdateSheetPropertiesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateSheetPropertiesRequest #

toConstr :: UpdateSheetPropertiesRequest -> Constr #

dataTypeOf :: UpdateSheetPropertiesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateSheetPropertiesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateSheetPropertiesRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateSheetPropertiesRequest -> UpdateSheetPropertiesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateSheetPropertiesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateSheetPropertiesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateSheetPropertiesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateSheetPropertiesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateSheetPropertiesRequest -> m UpdateSheetPropertiesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateSheetPropertiesRequest -> m UpdateSheetPropertiesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateSheetPropertiesRequest -> m UpdateSheetPropertiesRequest #

Show UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateSheetPropertiesRequest :: Type -> Type #

ToJSON UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateSheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateSheetPropertiesRequest = D1 (MetaData "UpdateSheetPropertiesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateSheetPropertiesRequest'" PrefixI True) (S1 (MetaSel (Just "_usprFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_usprProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SheetProperties))))

updateSheetPropertiesRequest :: UpdateSheetPropertiesRequest Source #

Creates a value of UpdateSheetPropertiesRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

usprFields :: Lens' UpdateSheetPropertiesRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `properties` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

Spreadsheet

data Spreadsheet Source #

Resource that represents a spreadsheet.

See: spreadsheet smart constructor.

Instances
Eq Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Spreadsheet -> c Spreadsheet #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Spreadsheet #

toConstr :: Spreadsheet -> Constr #

dataTypeOf :: Spreadsheet -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Spreadsheet) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Spreadsheet) #

gmapT :: (forall b. Data b => b -> b) -> Spreadsheet -> Spreadsheet #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Spreadsheet -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Spreadsheet -> r #

gmapQ :: (forall d. Data d => d -> u) -> Spreadsheet -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Spreadsheet -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Spreadsheet -> m Spreadsheet #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Spreadsheet -> m Spreadsheet #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Spreadsheet -> m Spreadsheet #

Show Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Spreadsheet :: Type -> Type #

ToJSON Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Spreadsheet Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Spreadsheet = D1 (MetaData "Spreadsheet" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Spreadsheet'" PrefixI True) ((S1 (MetaSel (Just "_sprSheets") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Sheet])) :*: (S1 (MetaSel (Just "_sprNamedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [NamedRange])) :*: S1 (MetaSel (Just "_sprSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_sprSpreadsheetURL") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_sprDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeveloperMetadata])) :*: S1 (MetaSel (Just "_sprProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SpreadsheetProperties))))))

spreadsheet :: Spreadsheet Source #

Creates a value of Spreadsheet with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sprSheets :: Lens' Spreadsheet [Sheet] Source #

The sheets that are part of a spreadsheet.

sprNamedRanges :: Lens' Spreadsheet [NamedRange] Source #

The named ranges defined in a spreadsheet.

sprSpreadsheetId :: Lens' Spreadsheet (Maybe Text) Source #

The ID of the spreadsheet. This field is read-only.

sprSpreadsheetURL :: Lens' Spreadsheet (Maybe Text) Source #

The url of the spreadsheet. This field is read-only.

sprDeveloperMetadata :: Lens' Spreadsheet [DeveloperMetadata] Source #

The developer metadata associated with a spreadsheet.

sprProperties :: Lens' Spreadsheet (Maybe SpreadsheetProperties) Source #

Overall properties of a spreadsheet.

CandlestickChartSpec

data CandlestickChartSpec Source #

A candlestick chart.

See: candlestickChartSpec smart constructor.

Instances
Eq CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CandlestickChartSpec -> c CandlestickChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CandlestickChartSpec #

toConstr :: CandlestickChartSpec -> Constr #

dataTypeOf :: CandlestickChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CandlestickChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CandlestickChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> CandlestickChartSpec -> CandlestickChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> CandlestickChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CandlestickChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CandlestickChartSpec -> m CandlestickChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickChartSpec -> m CandlestickChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickChartSpec -> m CandlestickChartSpec #

Show CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CandlestickChartSpec :: Type -> Type #

ToJSON CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickChartSpec = D1 (MetaData "CandlestickChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CandlestickChartSpec'" PrefixI True) (S1 (MetaSel (Just "_ccsData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [CandlestickData])) :*: S1 (MetaSel (Just "_ccsDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickDomain))))

candlestickChartSpec :: CandlestickChartSpec Source #

Creates a value of CandlestickChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ccsData :: Lens' CandlestickChartSpec [CandlestickData] Source #

The Candlestick chart data. Only one CandlestickData is supported.

ccsDomain :: Lens' CandlestickChartSpec (Maybe CandlestickDomain) Source #

The domain data (horizontal axis) for the candlestick chart. String data will be treated as discrete labels, other data will be treated as continuous values.

InsertDimensionRequest

data InsertDimensionRequest Source #

Inserts rows or columns in a sheet at a particular index.

See: insertDimensionRequest smart constructor.

Instances
Eq InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InsertDimensionRequest -> c InsertDimensionRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InsertDimensionRequest #

toConstr :: InsertDimensionRequest -> Constr #

dataTypeOf :: InsertDimensionRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InsertDimensionRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InsertDimensionRequest) #

gmapT :: (forall b. Data b => b -> b) -> InsertDimensionRequest -> InsertDimensionRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InsertDimensionRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InsertDimensionRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> InsertDimensionRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InsertDimensionRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InsertDimensionRequest -> m InsertDimensionRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertDimensionRequest -> m InsertDimensionRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertDimensionRequest -> m InsertDimensionRequest #

Show InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep InsertDimensionRequest :: Type -> Type #

ToJSON InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InsertDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InsertDimensionRequest = D1 (MetaData "InsertDimensionRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "InsertDimensionRequest'" PrefixI True) (S1 (MetaSel (Just "_idrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRange)) :*: S1 (MetaSel (Just "_idrInheritFromBefore") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

insertDimensionRequest :: InsertDimensionRequest Source #

Creates a value of InsertDimensionRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

idrRange :: Lens' InsertDimensionRequest (Maybe DimensionRange) Source #

The dimensions to insert. Both the start and end indexes must be bounded.

idrInheritFromBefore :: Lens' InsertDimensionRequest (Maybe Bool) Source #

Whether dimension properties should be extended from the dimensions before or after the newly inserted dimensions. True to inherit from the dimensions before (in which case the start index must be greater than 0), and false to inherit from the dimensions after. For example, if row index 0 has red background and row index 1 has a green background, then inserting 2 rows at index 1 can inherit either the green or red background. If `inheritFromBefore` is true, the two new rows will be red (because the row before the insertion point was red), whereas if `inheritFromBefore` is false, the two new rows will be green (because the row after the insertion point was green).

SearchDeveloperMetadataResponse

data SearchDeveloperMetadataResponse Source #

A reply to a developer metadata search request.

See: searchDeveloperMetadataResponse smart constructor.

Instances
Eq SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SearchDeveloperMetadataResponse -> c SearchDeveloperMetadataResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SearchDeveloperMetadataResponse #

toConstr :: SearchDeveloperMetadataResponse -> Constr #

dataTypeOf :: SearchDeveloperMetadataResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SearchDeveloperMetadataResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SearchDeveloperMetadataResponse) #

gmapT :: (forall b. Data b => b -> b) -> SearchDeveloperMetadataResponse -> SearchDeveloperMetadataResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SearchDeveloperMetadataResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SearchDeveloperMetadataResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> SearchDeveloperMetadataResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SearchDeveloperMetadataResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataResponse -> m SearchDeveloperMetadataResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataResponse -> m SearchDeveloperMetadataResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataResponse -> m SearchDeveloperMetadataResponse #

Show SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SearchDeveloperMetadataResponse :: Type -> Type #

ToJSON SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SearchDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SearchDeveloperMetadataResponse = D1 (MetaData "SearchDeveloperMetadataResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "SearchDeveloperMetadataResponse'" PrefixI True) (S1 (MetaSel (Just "_sdmrMatchedDeveloperMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [MatchedDeveloperMetadata]))))

searchDeveloperMetadataResponse :: SearchDeveloperMetadataResponse Source #

Creates a value of SearchDeveloperMetadataResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sdmrMatchedDeveloperMetadata :: Lens' SearchDeveloperMetadataResponse [MatchedDeveloperMetadata] Source #

The metadata matching the criteria of the search request.

PivotValueSummarizeFunction

data PivotValueSummarizeFunction Source #

A function to summarize the value. If formula is set, the only supported values are SUM and CUSTOM. If sourceColumnOffset is set, then `CUSTOM` is not supported.

Constructors

PivotStandardValueFunctionUnspecified

PIVOT_STANDARD_VALUE_FUNCTION_UNSPECIFIED The default, do not use.

Sum

SUM Corresponds to the `SUM` function.

Counta

COUNTA Corresponds to the `COUNTA` function.

Count

COUNT Corresponds to the `COUNT` function.

Countunique

COUNTUNIQUE Corresponds to the `COUNTUNIQUE` function.

Average

AVERAGE Corresponds to the `AVERAGE` function.

Max

MAX Corresponds to the `MAX` function.

Min

MIN Corresponds to the `MIN` function.

Median

MEDIAN Corresponds to the `MEDIAN` function.

Product

PRODUCT Corresponds to the `PRODUCT` function.

Stdev

STDEV Corresponds to the `STDEV` function.

Stdevp

STDEVP Corresponds to the `STDEVP` function.

Var

VAR Corresponds to the `VAR` function.

Varp

VARP Corresponds to the `VARP` function.

Custom

CUSTOM Indicates the formula should be used as-is. Only valid if PivotValue.formula was set.

Instances
Enum PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotValueSummarizeFunction -> c PivotValueSummarizeFunction #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotValueSummarizeFunction #

toConstr :: PivotValueSummarizeFunction -> Constr #

dataTypeOf :: PivotValueSummarizeFunction -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotValueSummarizeFunction) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotValueSummarizeFunction) #

gmapT :: (forall b. Data b => b -> b) -> PivotValueSummarizeFunction -> PivotValueSummarizeFunction #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotValueSummarizeFunction -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotValueSummarizeFunction -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotValueSummarizeFunction -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotValueSummarizeFunction -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotValueSummarizeFunction -> m PivotValueSummarizeFunction #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValueSummarizeFunction -> m PivotValueSummarizeFunction #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValueSummarizeFunction -> m PivotValueSummarizeFunction #

Ord PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PivotValueSummarizeFunction :: Type -> Type #

Hashable PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotValueSummarizeFunction Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotValueSummarizeFunction = D1 (MetaData "PivotValueSummarizeFunction" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "PivotStandardValueFunctionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Sum" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Counta" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Count" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Countunique" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Average" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Max" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "Min" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Median" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Product" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Stdev" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Stdevp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Var" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Varp" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Custom" PrefixI False) (U1 :: Type -> Type)))))

InterpolationPoint

data InterpolationPoint Source #

A single interpolation point on a gradient conditional format. These pin the gradient color scale according to the color, type and value chosen.

See: interpolationPoint smart constructor.

Instances
Eq InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InterpolationPoint -> c InterpolationPoint #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InterpolationPoint #

toConstr :: InterpolationPoint -> Constr #

dataTypeOf :: InterpolationPoint -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InterpolationPoint) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InterpolationPoint) #

gmapT :: (forall b. Data b => b -> b) -> InterpolationPoint -> InterpolationPoint #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InterpolationPoint -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InterpolationPoint -> r #

gmapQ :: (forall d. Data d => d -> u) -> InterpolationPoint -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InterpolationPoint -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InterpolationPoint -> m InterpolationPoint #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InterpolationPoint -> m InterpolationPoint #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InterpolationPoint -> m InterpolationPoint #

Show InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep InterpolationPoint :: Type -> Type #

ToJSON InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InterpolationPoint Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InterpolationPoint = D1 (MetaData "InterpolationPoint" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "InterpolationPoint'" PrefixI True) (S1 (MetaSel (Just "_ipColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: (S1 (MetaSel (Just "_ipValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_ipType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InterpolationPointType)))))

interpolationPoint :: InterpolationPoint Source #

Creates a value of InterpolationPoint with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ipColor :: Lens' InterpolationPoint (Maybe Color) Source #

The color this interpolation point should use.

ipValue :: Lens' InterpolationPoint (Maybe Text) Source #

The value this interpolation point uses. May be a formula. Unused if type is MIN or MAX.

ipType :: Lens' InterpolationPoint (Maybe InterpolationPointType) Source #

How the value should be interpreted.

OrgChartSpecNodeSize

data OrgChartSpecNodeSize Source #

The size of the org chart nodes.

Constructors

OrgChartLabelSizeUnspecified

ORG_CHART_LABEL_SIZE_UNSPECIFIED Default value, do not use.

Small

SMALL The small org chart node size.

Medium

MEDIUM The medium org chart node size.

Large

LARGE The large org chart node size.

Instances
Enum OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrgChartSpecNodeSize -> c OrgChartSpecNodeSize #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrgChartSpecNodeSize #

toConstr :: OrgChartSpecNodeSize -> Constr #

dataTypeOf :: OrgChartSpecNodeSize -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrgChartSpecNodeSize) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrgChartSpecNodeSize) #

gmapT :: (forall b. Data b => b -> b) -> OrgChartSpecNodeSize -> OrgChartSpecNodeSize #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrgChartSpecNodeSize -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrgChartSpecNodeSize -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrgChartSpecNodeSize -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrgChartSpecNodeSize -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrgChartSpecNodeSize -> m OrgChartSpecNodeSize #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrgChartSpecNodeSize -> m OrgChartSpecNodeSize #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrgChartSpecNodeSize -> m OrgChartSpecNodeSize #

Ord OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep OrgChartSpecNodeSize :: Type -> Type #

Hashable OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep OrgChartSpecNodeSize Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep OrgChartSpecNodeSize = D1 (MetaData "OrgChartSpecNodeSize" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "OrgChartLabelSizeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Small" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Medium" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Large" PrefixI False) (U1 :: Type -> Type)))

CellData

data CellData Source #

Data about a specific cell.

See: cellData smart constructor.

Instances
Eq CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellData -> c CellData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellData #

toConstr :: CellData -> Constr #

dataTypeOf :: CellData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellData) #

gmapT :: (forall b. Data b => b -> b) -> CellData -> CellData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellData -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellData -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellData -> m CellData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellData -> m CellData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellData -> m CellData #

Show CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CellData :: Type -> Type #

Methods

from :: CellData -> Rep CellData x #

to :: Rep CellData x -> CellData #

ToJSON CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CellData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

cellData :: CellData Source #

Creates a value of CellData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cdTextFormatRuns :: Lens' CellData [TextFormatRun] Source #

Runs of rich text applied to subsections of the cell. Runs are only valid on user entered strings, not formulas, bools, or numbers. Runs start at specific indexes in the text and continue until the next run. Properties of a run will continue unless explicitly changed in a subsequent run (and properties of the first run will continue the properties of the cell unless explicitly changed). When writing, the new runs will overwrite any prior runs. When writing a new user_entered_value, previous runs are erased.

cdNote :: Lens' CellData (Maybe Text) Source #

Any note on the cell.

cdUserEnteredValue :: Lens' CellData (Maybe ExtendedValue) Source #

The value the user entered in the cell. e.g, `1234`, `'Hello'`, or `=NOW()` Note: Dates, Times and DateTimes are represented as doubles in serial number format.

cdUserEnteredFormat :: Lens' CellData (Maybe CellFormat) Source #

The format the user entered for the cell. When writing, the new format will be merged with the existing format.

cdEffectiveFormat :: Lens' CellData (Maybe CellFormat) Source #

The effective format being used by the cell. This includes the results of applying any conditional formatting and, if the cell contains a formula, the computed number format. If the effective format is the default format, effective format will not be written. This field is read-only.

cdPivotTable :: Lens' CellData (Maybe PivotTable) Source #

A pivot table anchored at this cell. The size of pivot table itself is computed dynamically based on its data, grouping, filters, values, etc. Only the top-left cell of the pivot table contains the pivot table definition. The other cells will contain the calculated values of the results of the pivot in their effective_value fields.

cdFormattedValue :: Lens' CellData (Maybe Text) Source #

The formatted value of the cell. This is the value as it's shown to the user. This field is read-only.

cdDataValidation :: Lens' CellData (Maybe DataValidationRule) Source #

A data validation rule on the cell, if any. When writing, the new data validation rule will overwrite any prior rule.

cdHyperlink :: Lens' CellData (Maybe Text) Source #

A hyperlink this cell points to, if any. This field is read-only. (To set it, use a `=HYPERLINK` formula in the userEnteredValue.formulaValue field.)

cdEffectiveValue :: Lens' CellData (Maybe ExtendedValue) Source #

The effective value of the cell. For cells with formulas, this is the calculated value. For cells with literals, this is the same as the user_entered_value. This field is read-only.

BatchUpdateValuesByDataFilterRequestResponseValueRenderOption

data BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source #

Determines how values in the response should be rendered. The default render option is ValueRenderOption.FORMATTED_VALUE.

Constructors

BUVBDFRRVROFormattedValue

FORMATTED_VALUE Values will be calculated & formatted in the reply according to the cell's formatting. Formatting is based on the spreadsheet's locale, not the requesting user's locale. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return `"$1.23"`.

BUVBDFRRVROUnformattedValue

UNFORMATTED_VALUE Values will be calculated, but not formatted in the reply. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then `A2` would return the number `1.23`.

BUVBDFRRVROFormula

FORMULA Values will not be calculated. The reply will include the formulas. For example, if `A1` is `1.23` and `A2` is `=A1` and formatted as currency, then A2 would return `"=A1"`.

Instances
Enum BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> c BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

toConstr :: BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> Constr #

dataTypeOf :: BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateValuesByDataFilterRequestResponseValueRenderOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateValuesByDataFilterRequestResponseValueRenderOption) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> m BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> m BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestResponseValueRenderOption -> m BatchUpdateValuesByDataFilterRequestResponseValueRenderOption #

Ord BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestResponseValueRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestResponseValueRenderOption = D1 (MetaData "BatchUpdateValuesByDataFilterRequestResponseValueRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BUVBDFRRVROFormattedValue" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BUVBDFRRVROUnformattedValue" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BUVBDFRRVROFormula" PrefixI False) (U1 :: Type -> Type)))

ChartSourceRange

data ChartSourceRange Source #

Source ranges for a chart.

See: chartSourceRange smart constructor.

Instances
Eq ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChartSourceRange -> c ChartSourceRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChartSourceRange #

toConstr :: ChartSourceRange -> Constr #

dataTypeOf :: ChartSourceRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ChartSourceRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChartSourceRange) #

gmapT :: (forall b. Data b => b -> b) -> ChartSourceRange -> ChartSourceRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChartSourceRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChartSourceRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChartSourceRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChartSourceRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChartSourceRange -> m ChartSourceRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSourceRange -> m ChartSourceRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSourceRange -> m ChartSourceRange #

Show ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ChartSourceRange :: Type -> Type #

ToJSON ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartSourceRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartSourceRange = D1 (MetaData "ChartSourceRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "ChartSourceRange'" PrefixI True) (S1 (MetaSel (Just "_csrSources") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [GridRange]))))

chartSourceRange :: ChartSourceRange Source #

Creates a value of ChartSourceRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

csrSources :: Lens' ChartSourceRange [GridRange] Source #

The ranges of data for a series or domain. Exactly one dimension must have a length of 1, and all sources in the list must have the same dimension with length 1. The domain (if it exists) & all series must have the same number of source ranges. If using more than one source range, then the source range at a given offset must be in order and contiguous across the domain and series. For example, these are valid configurations: domain sources: A1:A5 series1 sources: B1:B5 series2 sources: D6:D10 domain sources: A1:A5, C10:C12 series1 sources: B1:B5, D10:D12 series2 sources: C1:C5, E10:E12

AddNamedRangeResponse

data AddNamedRangeResponse Source #

The result of adding a named range.

See: addNamedRangeResponse smart constructor.

Instances
Eq AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddNamedRangeResponse -> c AddNamedRangeResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddNamedRangeResponse #

toConstr :: AddNamedRangeResponse -> Constr #

dataTypeOf :: AddNamedRangeResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddNamedRangeResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddNamedRangeResponse) #

gmapT :: (forall b. Data b => b -> b) -> AddNamedRangeResponse -> AddNamedRangeResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddNamedRangeResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddNamedRangeResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddNamedRangeResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddNamedRangeResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddNamedRangeResponse -> m AddNamedRangeResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddNamedRangeResponse -> m AddNamedRangeResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddNamedRangeResponse -> m AddNamedRangeResponse #

Show AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddNamedRangeResponse :: Type -> Type #

ToJSON AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddNamedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddNamedRangeResponse = D1 (MetaData "AddNamedRangeResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddNamedRangeResponse'" PrefixI True) (S1 (MetaSel (Just "_anrrNamedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe NamedRange))))

addNamedRangeResponse :: AddNamedRangeResponse Source #

Creates a value of AddNamedRangeResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

WaterfallChartDomain

data WaterfallChartDomain Source #

The domain of a waterfall chart.

See: waterfallChartDomain smart constructor.

Instances
Eq WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartDomain -> c WaterfallChartDomain #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartDomain #

toConstr :: WaterfallChartDomain -> Constr #

dataTypeOf :: WaterfallChartDomain -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartDomain) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartDomain) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartDomain -> WaterfallChartDomain #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartDomain -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartDomain -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartDomain -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartDomain -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartDomain -> m WaterfallChartDomain #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartDomain -> m WaterfallChartDomain #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartDomain -> m WaterfallChartDomain #

Show WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep WaterfallChartDomain :: Type -> Type #

ToJSON WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartDomain = D1 (MetaData "WaterfallChartDomain" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WaterfallChartDomain'" PrefixI True) (S1 (MetaSel (Just "_wcdReversed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_wcdData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))

waterfallChartDomain :: WaterfallChartDomain Source #

Creates a value of WaterfallChartDomain with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wcdReversed :: Lens' WaterfallChartDomain (Maybe Bool) Source #

True to reverse the order of the domain values (horizontal axis).

wcdData :: Lens' WaterfallChartDomain (Maybe ChartData) Source #

The data of the WaterfallChartDomain.

AddChartResponse

data AddChartResponse Source #

The result of adding a chart to a spreadsheet.

See: addChartResponse smart constructor.

Instances
Eq AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddChartResponse -> c AddChartResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddChartResponse #

toConstr :: AddChartResponse -> Constr #

dataTypeOf :: AddChartResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddChartResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddChartResponse) #

gmapT :: (forall b. Data b => b -> b) -> AddChartResponse -> AddChartResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddChartResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddChartResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddChartResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddChartResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddChartResponse -> m AddChartResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddChartResponse -> m AddChartResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddChartResponse -> m AddChartResponse #

Show AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddChartResponse :: Type -> Type #

ToJSON AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddChartResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddChartResponse = D1 (MetaData "AddChartResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddChartResponse'" PrefixI True) (S1 (MetaSel (Just "_acrChart") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe EmbeddedChart))))

addChartResponse :: AddChartResponse Source #

Creates a value of AddChartResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

UpdateChartSpecRequest

data UpdateChartSpecRequest Source #

Updates a chart's specifications. (This does not move or resize a chart. To move or resize a chart, use UpdateEmbeddedObjectPositionRequest.)

See: updateChartSpecRequest smart constructor.

Instances
Eq UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateChartSpecRequest -> c UpdateChartSpecRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateChartSpecRequest #

toConstr :: UpdateChartSpecRequest -> Constr #

dataTypeOf :: UpdateChartSpecRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateChartSpecRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateChartSpecRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateChartSpecRequest -> UpdateChartSpecRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateChartSpecRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateChartSpecRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateChartSpecRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateChartSpecRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateChartSpecRequest -> m UpdateChartSpecRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateChartSpecRequest -> m UpdateChartSpecRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateChartSpecRequest -> m UpdateChartSpecRequest #

Show UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateChartSpecRequest :: Type -> Type #

ToJSON UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateChartSpecRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateChartSpecRequest = D1 (MetaData "UpdateChartSpecRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateChartSpecRequest'" PrefixI True) (S1 (MetaSel (Just "_ucsrSpec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartSpec)) :*: S1 (MetaSel (Just "_ucsrChartId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

updateChartSpecRequest :: UpdateChartSpecRequest Source #

Creates a value of UpdateChartSpecRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ucsrSpec :: Lens' UpdateChartSpecRequest (Maybe ChartSpec) Source #

The specification to apply to the chart.

ucsrChartId :: Lens' UpdateChartSpecRequest (Maybe Int32) Source #

The ID of the chart to update.

SetBasicFilterRequest

data SetBasicFilterRequest Source #

Sets the basic filter associated with a sheet.

See: setBasicFilterRequest smart constructor.

Instances
Eq SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetBasicFilterRequest -> c SetBasicFilterRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetBasicFilterRequest #

toConstr :: SetBasicFilterRequest -> Constr #

dataTypeOf :: SetBasicFilterRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetBasicFilterRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetBasicFilterRequest) #

gmapT :: (forall b. Data b => b -> b) -> SetBasicFilterRequest -> SetBasicFilterRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetBasicFilterRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetBasicFilterRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetBasicFilterRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetBasicFilterRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetBasicFilterRequest -> m SetBasicFilterRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetBasicFilterRequest -> m SetBasicFilterRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetBasicFilterRequest -> m SetBasicFilterRequest #

Show SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SetBasicFilterRequest :: Type -> Type #

ToJSON SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SetBasicFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SetBasicFilterRequest = D1 (MetaData "SetBasicFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "SetBasicFilterRequest'" PrefixI True) (S1 (MetaSel (Just "_sbfrFilter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe BasicFilter))))

setBasicFilterRequest :: SetBasicFilterRequest Source #

Creates a value of SetBasicFilterRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

IterativeCalculationSettings

data IterativeCalculationSettings Source #

Settings to control how circular dependencies are resolved with iterative calculation.

See: iterativeCalculationSettings smart constructor.

Instances
Eq IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> IterativeCalculationSettings -> c IterativeCalculationSettings #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c IterativeCalculationSettings #

toConstr :: IterativeCalculationSettings -> Constr #

dataTypeOf :: IterativeCalculationSettings -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c IterativeCalculationSettings) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c IterativeCalculationSettings) #

gmapT :: (forall b. Data b => b -> b) -> IterativeCalculationSettings -> IterativeCalculationSettings #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> IterativeCalculationSettings -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> IterativeCalculationSettings -> r #

gmapQ :: (forall d. Data d => d -> u) -> IterativeCalculationSettings -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> IterativeCalculationSettings -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> IterativeCalculationSettings -> m IterativeCalculationSettings #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> IterativeCalculationSettings -> m IterativeCalculationSettings #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> IterativeCalculationSettings -> m IterativeCalculationSettings #

Show IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep IterativeCalculationSettings :: Type -> Type #

ToJSON IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep IterativeCalculationSettings Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep IterativeCalculationSettings = D1 (MetaData "IterativeCalculationSettings" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "IterativeCalculationSettings'" PrefixI True) (S1 (MetaSel (Just "_icsMaxIterations") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_icsConvergenceThreshold") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))))

iterativeCalculationSettings :: IterativeCalculationSettings Source #

Creates a value of IterativeCalculationSettings with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

icsMaxIterations :: Lens' IterativeCalculationSettings (Maybe Int32) Source #

When iterative calculation is enabled, the maximum number of calculation rounds to perform.

icsConvergenceThreshold :: Lens' IterativeCalculationSettings (Maybe Double) Source #

When iterative calculation is enabled and successive results differ by less than this threshold value, the calculation rounds stop.

UpdateValuesByDataFilterResponse

data UpdateValuesByDataFilterResponse Source #

The response when updating a range of values by a data filter in a spreadsheet.

See: updateValuesByDataFilterResponse smart constructor.

Instances
Eq UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateValuesByDataFilterResponse -> c UpdateValuesByDataFilterResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateValuesByDataFilterResponse #

toConstr :: UpdateValuesByDataFilterResponse -> Constr #

dataTypeOf :: UpdateValuesByDataFilterResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateValuesByDataFilterResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateValuesByDataFilterResponse) #

gmapT :: (forall b. Data b => b -> b) -> UpdateValuesByDataFilterResponse -> UpdateValuesByDataFilterResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateValuesByDataFilterResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateValuesByDataFilterResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateValuesByDataFilterResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateValuesByDataFilterResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateValuesByDataFilterResponse -> m UpdateValuesByDataFilterResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateValuesByDataFilterResponse -> m UpdateValuesByDataFilterResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateValuesByDataFilterResponse -> m UpdateValuesByDataFilterResponse #

Show UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateValuesByDataFilterResponse :: Type -> Type #

ToJSON UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateValuesByDataFilterResponse = D1 (MetaData "UpdateValuesByDataFilterResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateValuesByDataFilterResponse'" PrefixI True) ((S1 (MetaSel (Just "_uvbdfrUpdatedCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_uvbdfrUpdatedRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_uvbdfrUpdatedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))) :*: (S1 (MetaSel (Just "_uvbdfrUpdatedData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ValueRange)) :*: (S1 (MetaSel (Just "_uvbdfrUpdatedColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_uvbdfrDataFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DataFilter))))))

updateValuesByDataFilterResponse :: UpdateValuesByDataFilterResponse Source #

Creates a value of UpdateValuesByDataFilterResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uvbdfrUpdatedRows :: Lens' UpdateValuesByDataFilterResponse (Maybe Int32) Source #

The number of rows where at least one cell in the row was updated.

uvbdfrUpdatedRange :: Lens' UpdateValuesByDataFilterResponse (Maybe Text) Source #

The range (in A1 notation) that updates were applied to.

uvbdfrUpdatedData :: Lens' UpdateValuesByDataFilterResponse (Maybe ValueRange) Source #

The values of the cells in the range matched by the dataFilter after all updates were applied. This is only included if the request's `includeValuesInResponse` field was `true`.

uvbdfrUpdatedColumns :: Lens' UpdateValuesByDataFilterResponse (Maybe Int32) Source #

The number of columns where at least one cell in the column was updated.

uvbdfrDataFilter :: Lens' UpdateValuesByDataFilterResponse (Maybe DataFilter) Source #

The data filter that selected the range that was updated.

GridProperties

data GridProperties Source #

Properties of a grid.

See: gridProperties smart constructor.

Instances
Eq GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GridProperties -> c GridProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GridProperties #

toConstr :: GridProperties -> Constr #

dataTypeOf :: GridProperties -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GridProperties) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GridProperties) #

gmapT :: (forall b. Data b => b -> b) -> GridProperties -> GridProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GridProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GridProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> GridProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GridProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GridProperties -> m GridProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GridProperties -> m GridProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GridProperties -> m GridProperties #

Show GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GridProperties :: Type -> Type #

ToJSON GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridProperties = D1 (MetaData "GridProperties" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GridProperties'" PrefixI True) ((S1 (MetaSel (Just "_gpFrozenColumnCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_gpColumnCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_gpColumnGroupControlAfter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))) :*: ((S1 (MetaSel (Just "_gpHideGridlines") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gpFrozenRowCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_gpRowGroupControlAfter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_gpRowCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

gridProperties :: GridProperties Source #

Creates a value of GridProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gpFrozenColumnCount :: Lens' GridProperties (Maybe Int32) Source #

The number of columns that are frozen in the grid.

gpColumnCount :: Lens' GridProperties (Maybe Int32) Source #

The number of columns in the grid.

gpColumnGroupControlAfter :: Lens' GridProperties (Maybe Bool) Source #

True if the column grouping control toggle is shown after the group.

gpHideGridlines :: Lens' GridProperties (Maybe Bool) Source #

True if the grid isn't showing gridlines in the UI.

gpFrozenRowCount :: Lens' GridProperties (Maybe Int32) Source #

The number of rows that are frozen in the grid.

gpRowGroupControlAfter :: Lens' GridProperties (Maybe Bool) Source #

True if the row grouping control toggle is shown after the group.

gpRowCount :: Lens' GridProperties (Maybe Int32) Source #

The number of rows in the grid.

LineStyleType

data LineStyleType Source #

The dash type of the line.

Constructors

LSTLineDashTypeUnspecified

LINE_DASH_TYPE_UNSPECIFIED Default value, do not use.

LSTInvisible

INVISIBLE No dash type, which is equivalent to a non-visible line.

LSTCustom

CUSTOM A custom dash for a line. Modifying the exact custom dash style is currently unsupported.

LSTSolid

SOLID A solid line.

LSTDotted

DOTTED A dotted line.

LSTMediumDashed

MEDIUM_DASHED A dashed line where the dashes have "medium" length.

LSTMediumDashedDotted

MEDIUM_DASHED_DOTTED A line that alternates between a "medium" dash and a dot.

LSTLongDashed

LONG_DASHED A dashed line where the dashes have "long" length.

LSTLongDashedDotted

LONG_DASHED_DOTTED A line that alternates between a "long" dash and a dot.

Instances
Enum LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> LineStyleType -> c LineStyleType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c LineStyleType #

toConstr :: LineStyleType -> Constr #

dataTypeOf :: LineStyleType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c LineStyleType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c LineStyleType) #

gmapT :: (forall b. Data b => b -> b) -> LineStyleType -> LineStyleType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> LineStyleType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> LineStyleType -> r #

gmapQ :: (forall d. Data d => d -> u) -> LineStyleType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> LineStyleType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> LineStyleType -> m LineStyleType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> LineStyleType -> m LineStyleType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> LineStyleType -> m LineStyleType #

Ord LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep LineStyleType :: Type -> Type #

Hashable LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep LineStyleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep LineStyleType = D1 (MetaData "LineStyleType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "LSTLineDashTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LSTInvisible" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "LSTCustom" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LSTSolid" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "LSTDotted" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LSTMediumDashed" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "LSTMediumDashedDotted" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "LSTLongDashed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "LSTLongDashedDotted" PrefixI False) (U1 :: Type -> Type)))))

HistogramChartSpec

data HistogramChartSpec Source #

A histogram chart. A histogram chart groups data items into bins, displaying each bin as a column of stacked items. Histograms are used to display the distribution of a dataset. Each column of items represents a range into which those items fall. The number of bins can be chosen automatically or specified explicitly.

See: histogramChartSpec smart constructor.

Instances
Eq HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HistogramChartSpec -> c HistogramChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HistogramChartSpec #

toConstr :: HistogramChartSpec -> Constr #

dataTypeOf :: HistogramChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HistogramChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HistogramChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> HistogramChartSpec -> HistogramChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HistogramChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HistogramChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> HistogramChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HistogramChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HistogramChartSpec -> m HistogramChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramChartSpec -> m HistogramChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramChartSpec -> m HistogramChartSpec #

Show HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep HistogramChartSpec :: Type -> Type #

ToJSON HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramChartSpec = D1 (MetaData "HistogramChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "HistogramChartSpec'" PrefixI True) ((S1 (MetaSel (Just "_hcsLegendPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HistogramChartSpecLegendPosition)) :*: S1 (MetaSel (Just "_hcsSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [HistogramSeries]))) :*: (S1 (MetaSel (Just "_hcsShowItemDividers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_hcsOutlierPercentile") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_hcsBucketSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))))))

histogramChartSpec :: HistogramChartSpec Source #

Creates a value of HistogramChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hcsSeries :: Lens' HistogramChartSpec [HistogramSeries] Source #

The series for a histogram may be either a single series of values to be bucketed or multiple series, each of the same length, containing the name of the series followed by the values to be bucketed for that series.

hcsShowItemDividers :: Lens' HistogramChartSpec (Maybe Bool) Source #

Whether horizontal divider lines should be displayed between items in each column.

hcsOutlierPercentile :: Lens' HistogramChartSpec (Maybe Double) Source #

The outlier percentile is used to ensure that outliers do not adversely affect the calculation of bucket sizes. For example, setting an outlier percentile of 0.05 indicates that the top and bottom 5% of values when calculating buckets. The values are still included in the chart, they will be added to the first or last buckets instead of their own buckets. Must be between 0.0 and 0.5.

hcsBucketSize :: Lens' HistogramChartSpec (Maybe Double) Source #

By default the bucket size (the range of values stacked in a single column) is chosen automatically, but it may be overridden here. E.g., A bucket size of 1.5 results in buckets from 0 - 1.5, 1.5 - 3.0, etc. Cannot be negative. This field is optional.

CellFormatHyperlinkDisplayType

data CellFormatHyperlinkDisplayType Source #

How a hyperlink, if it exists, should be displayed in the cell.

Constructors

HyperlinkDisplayTypeUnspecified

HYPERLINK_DISPLAY_TYPE_UNSPECIFIED The default value: the hyperlink is rendered. Do not use this.

Linked

LINKED A hyperlink should be explicitly rendered.

PlainText

PLAIN_TEXT A hyperlink should not be rendered.

Instances
Enum CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellFormatHyperlinkDisplayType -> c CellFormatHyperlinkDisplayType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellFormatHyperlinkDisplayType #

toConstr :: CellFormatHyperlinkDisplayType -> Constr #

dataTypeOf :: CellFormatHyperlinkDisplayType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellFormatHyperlinkDisplayType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellFormatHyperlinkDisplayType) #

gmapT :: (forall b. Data b => b -> b) -> CellFormatHyperlinkDisplayType -> CellFormatHyperlinkDisplayType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatHyperlinkDisplayType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatHyperlinkDisplayType -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellFormatHyperlinkDisplayType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellFormatHyperlinkDisplayType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellFormatHyperlinkDisplayType -> m CellFormatHyperlinkDisplayType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatHyperlinkDisplayType -> m CellFormatHyperlinkDisplayType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatHyperlinkDisplayType -> m CellFormatHyperlinkDisplayType #

Ord CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CellFormatHyperlinkDisplayType :: Type -> Type #

Hashable CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatHyperlinkDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatHyperlinkDisplayType = D1 (MetaData "CellFormatHyperlinkDisplayType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "HyperlinkDisplayTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Linked" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PlainText" PrefixI False) (U1 :: Type -> Type)))

BatchUpdateValuesByDataFilterRequestValueInputOption

data BatchUpdateValuesByDataFilterRequestValueInputOption Source #

How the input data should be interpreted.

Constructors

BUVBDFRVIOInputValueOptionUnspecified

INPUT_VALUE_OPTION_UNSPECIFIED Default input value. This value must not be used.

BUVBDFRVIORaw

RAW The values the user has entered will not be parsed and will be stored as-is.

BUVBDFRVIOUserEntered

USER_ENTERED The values will be parsed as if the user typed them into the UI. Numbers will stay as numbers, but strings may be converted to numbers, dates, etc. following the same rules that are applied when entering text into a cell via the Google Sheets UI.

Instances
Enum BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> c BatchUpdateValuesByDataFilterRequestValueInputOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateValuesByDataFilterRequestValueInputOption #

toConstr :: BatchUpdateValuesByDataFilterRequestValueInputOption -> Constr #

dataTypeOf :: BatchUpdateValuesByDataFilterRequestValueInputOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateValuesByDataFilterRequestValueInputOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateValuesByDataFilterRequestValueInputOption) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> BatchUpdateValuesByDataFilterRequestValueInputOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequestValueInputOption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequestValueInputOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> m BatchUpdateValuesByDataFilterRequestValueInputOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> m BatchUpdateValuesByDataFilterRequestValueInputOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequestValueInputOption -> m BatchUpdateValuesByDataFilterRequestValueInputOption #

Ord BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestValueInputOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchUpdateValuesByDataFilterRequestValueInputOption = D1 (MetaData "BatchUpdateValuesByDataFilterRequestValueInputOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BUVBDFRVIOInputValueOptionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BUVBDFRVIORaw" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BUVBDFRVIOUserEntered" PrefixI False) (U1 :: Type -> Type)))

BasicFilterCriteria

data BasicFilterCriteria Source #

The criteria for showing/hiding values per column. The map's key is the column index, and the value is the criteria for that column.

See: basicFilterCriteria smart constructor.

Instances
Eq BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicFilterCriteria -> c BasicFilterCriteria #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicFilterCriteria #

toConstr :: BasicFilterCriteria -> Constr #

dataTypeOf :: BasicFilterCriteria -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicFilterCriteria) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicFilterCriteria) #

gmapT :: (forall b. Data b => b -> b) -> BasicFilterCriteria -> BasicFilterCriteria #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicFilterCriteria -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicFilterCriteria -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicFilterCriteria -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicFilterCriteria -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicFilterCriteria -> m BasicFilterCriteria #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFilterCriteria -> m BasicFilterCriteria #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFilterCriteria -> m BasicFilterCriteria #

Show BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicFilterCriteria :: Type -> Type #

ToJSON BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicFilterCriteria = D1 (MetaData "BasicFilterCriteria" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "BasicFilterCriteria'" PrefixI True) (S1 (MetaSel (Just "_bfcAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text FilterCriteria))))

basicFilterCriteria Source #

Creates a value of BasicFilterCriteria with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AddBandingRequest

data AddBandingRequest Source #

Adds a new banded range to the spreadsheet.

See: addBandingRequest smart constructor.

Instances
Eq AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddBandingRequest -> c AddBandingRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddBandingRequest #

toConstr :: AddBandingRequest -> Constr #

dataTypeOf :: AddBandingRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddBandingRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddBandingRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddBandingRequest -> AddBandingRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddBandingRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddBandingRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddBandingRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddBandingRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddBandingRequest -> m AddBandingRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddBandingRequest -> m AddBandingRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddBandingRequest -> m AddBandingRequest #

Show AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddBandingRequest :: Type -> Type #

ToJSON AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddBandingRequest = D1 (MetaData "AddBandingRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddBandingRequest'" PrefixI True) (S1 (MetaSel (Just "_abrBandedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe BandedRange))))

addBandingRequest :: AddBandingRequest Source #

Creates a value of AddBandingRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

abrBandedRange :: Lens' AddBandingRequest (Maybe BandedRange) Source #

The banded range to add. The bandedRangeId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a range that already exists.)

UpdateDimensionPropertiesRequest

data UpdateDimensionPropertiesRequest Source #

Updates properties of dimensions within the specified range.

See: updateDimensionPropertiesRequest smart constructor.

Instances
Eq UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateDimensionPropertiesRequest -> c UpdateDimensionPropertiesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateDimensionPropertiesRequest #

toConstr :: UpdateDimensionPropertiesRequest -> Constr #

dataTypeOf :: UpdateDimensionPropertiesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateDimensionPropertiesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateDimensionPropertiesRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateDimensionPropertiesRequest -> UpdateDimensionPropertiesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDimensionPropertiesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDimensionPropertiesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateDimensionPropertiesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateDimensionPropertiesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateDimensionPropertiesRequest -> m UpdateDimensionPropertiesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDimensionPropertiesRequest -> m UpdateDimensionPropertiesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDimensionPropertiesRequest -> m UpdateDimensionPropertiesRequest #

Show UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateDimensionPropertiesRequest :: Type -> Type #

ToJSON UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDimensionPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDimensionPropertiesRequest = D1 (MetaData "UpdateDimensionPropertiesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateDimensionPropertiesRequest'" PrefixI True) (S1 (MetaSel (Just "_udprRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRange)) :*: (S1 (MetaSel (Just "_udprFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_udprProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionProperties)))))

updateDimensionPropertiesRequest :: UpdateDimensionPropertiesRequest Source #

Creates a value of UpdateDimensionPropertiesRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

udprFields :: Lens' UpdateDimensionPropertiesRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `properties` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

PivotTableCriteria

data PivotTableCriteria Source #

An optional mapping of filters per source column offset. The filters are applied before aggregating data into the pivot table. The map's key is the column offset of the source range that you want to filter, and the value is the criteria for that column. For example, if the source was `C10:E15`, a key of `0` will have the filter for column `C`, whereas the key `1` is for column `D`.

See: pivotTableCriteria smart constructor.

Instances
Eq PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotTableCriteria -> c PivotTableCriteria #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotTableCriteria #

toConstr :: PivotTableCriteria -> Constr #

dataTypeOf :: PivotTableCriteria -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotTableCriteria) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotTableCriteria) #

gmapT :: (forall b. Data b => b -> b) -> PivotTableCriteria -> PivotTableCriteria #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotTableCriteria -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotTableCriteria -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotTableCriteria -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotTableCriteria -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotTableCriteria -> m PivotTableCriteria #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTableCriteria -> m PivotTableCriteria #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTableCriteria -> m PivotTableCriteria #

Show PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotTableCriteria :: Type -> Type #

ToJSON PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotTableCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotTableCriteria = D1 (MetaData "PivotTableCriteria" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "PivotTableCriteria'" PrefixI True) (S1 (MetaSel (Just "_ptcAddtional") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (HashMap Text PivotFilterCriteria))))

pivotTableCriteria Source #

Creates a value of PivotTableCriteria with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AutoFillRequest

data AutoFillRequest Source #

Fills in more data based on existing data.

See: autoFillRequest smart constructor.

Instances
Eq AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AutoFillRequest -> c AutoFillRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AutoFillRequest #

toConstr :: AutoFillRequest -> Constr #

dataTypeOf :: AutoFillRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AutoFillRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AutoFillRequest) #

gmapT :: (forall b. Data b => b -> b) -> AutoFillRequest -> AutoFillRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AutoFillRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AutoFillRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AutoFillRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AutoFillRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AutoFillRequest -> m AutoFillRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AutoFillRequest -> m AutoFillRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AutoFillRequest -> m AutoFillRequest #

Show AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AutoFillRequest :: Type -> Type #

ToJSON AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AutoFillRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AutoFillRequest = D1 (MetaData "AutoFillRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "AutoFillRequest'" PrefixI True) (S1 (MetaSel (Just "_afrSourceAndDestination") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SourceAndDestination)) :*: (S1 (MetaSel (Just "_afrUseAlternateSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_afrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)))))

autoFillRequest :: AutoFillRequest Source #

Creates a value of AutoFillRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

afrSourceAndDestination :: Lens' AutoFillRequest (Maybe SourceAndDestination) Source #

The source and destination areas to autofill. This explicitly lists the source of the autofill and where to extend that data.

afrUseAlternateSeries :: Lens' AutoFillRequest (Maybe Bool) Source #

True if we should generate data with the "alternate" series. This differs based on the type and amount of source data.

afrRange :: Lens' AutoFillRequest (Maybe GridRange) Source #

The range to autofill. This will examine the range and detect the location that has data and automatically fill that data in to the rest of the range.

DeveloperMetadataLookup

data DeveloperMetadataLookup Source #

Selects DeveloperMetadata that matches all of the specified fields. For example, if only a metadata ID is specified this considers the DeveloperMetadata with that particular unique ID. If a metadata key is specified, this considers all developer metadata with that key. If a key, visibility, and location type are all specified, this considers all developer metadata with that key and visibility that are associated with a location of that type. In general, this selects all DeveloperMetadata that matches the intersection of all the specified fields; any field or combination of fields may be specified.

See: developerMetadataLookup smart constructor.

Instances
Eq DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadataLookup -> c DeveloperMetadataLookup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadataLookup #

toConstr :: DeveloperMetadataLookup -> Constr #

dataTypeOf :: DeveloperMetadataLookup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadataLookup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadataLookup) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadataLookup -> DeveloperMetadataLookup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookup -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookup -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadataLookup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadataLookup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookup -> m DeveloperMetadataLookup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookup -> m DeveloperMetadataLookup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookup -> m DeveloperMetadataLookup #

Show DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeveloperMetadataLookup :: Type -> Type #

ToJSON DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeveloperMetadataLookup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

developerMetadataLookup :: DeveloperMetadataLookup Source #

Creates a value of DeveloperMetadataLookup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dLocationMatchingStrategy :: Lens' DeveloperMetadataLookup (Maybe DeveloperMetadataLookupLocationMatchingStrategy) Source #

Determines how this lookup matches the location. If this field is specified as EXACT, only developer metadata associated on the exact location specified is matched. If this field is specified to INTERSECTING, developer metadata associated on intersecting locations is also matched. If left unspecified, this field assumes a default value of INTERSECTING. If this field is specified, a metadataLocation must also be specified.

dMetadataId :: Lens' DeveloperMetadataLookup (Maybe Int32) Source #

Limits the selected developer metadata to that which has a matching DeveloperMetadata.metadata_id.

dVisibility :: Lens' DeveloperMetadataLookup (Maybe DeveloperMetadataLookupVisibility) Source #

Limits the selected developer metadata to that which has a matching DeveloperMetadata.visibility. If left unspecified, all developer metadata visibile to the requesting project is considered.

dMetadataKey :: Lens' DeveloperMetadataLookup (Maybe Text) Source #

Limits the selected developer metadata to that which has a matching DeveloperMetadata.metadata_key.

dLocationType :: Lens' DeveloperMetadataLookup (Maybe DeveloperMetadataLookupLocationType) Source #

Limits the selected developer metadata to those entries which are associated with locations of the specified type. For example, when this field is specified as ROW this lookup only considers developer metadata associated on rows. If the field is left unspecified, all location types are considered. This field cannot be specified as SPREADSHEET when the locationMatchingStrategy is specified as INTERSECTING or when the metadataLocation is specified as a non-spreadsheet location: spreadsheet metadata cannot intersect any other developer metadata location. This field also must be left unspecified when the locationMatchingStrategy is specified as EXACT.

dMetadataLocation :: Lens' DeveloperMetadataLookup (Maybe DeveloperMetadataLocation) Source #

Limits the selected developer metadata to those entries associated with the specified location. This field either matches exact locations or all intersecting locations according the specified locationMatchingStrategy.

dMetadataValue :: Lens' DeveloperMetadataLookup (Maybe Text) Source #

Limits the selected developer metadata to that which has a matching DeveloperMetadata.metadata_value.

HistogramChartSpecLegendPosition

data HistogramChartSpecLegendPosition Source #

The position of the chart legend.

Constructors

HCSLPHistogramChartLegendPositionUnspecified

HISTOGRAM_CHART_LEGEND_POSITION_UNSPECIFIED Default value, do not use.

HCSLPBottomLegend

BOTTOM_LEGEND The legend is rendered on the bottom of the chart.

HCSLPLeftLegend

LEFT_LEGEND The legend is rendered on the left of the chart.

HCSLPRightLegend

RIGHT_LEGEND The legend is rendered on the right of the chart.

HCSLPTopLegend

TOP_LEGEND The legend is rendered on the top of the chart.

HCSLPNoLegend

NO_LEGEND No legend is rendered.

HCSLPInsideLegend

INSIDE_LEGEND The legend is rendered inside the chart area.

Instances
Enum HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HistogramChartSpecLegendPosition -> c HistogramChartSpecLegendPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HistogramChartSpecLegendPosition #

toConstr :: HistogramChartSpecLegendPosition -> Constr #

dataTypeOf :: HistogramChartSpecLegendPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HistogramChartSpecLegendPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HistogramChartSpecLegendPosition) #

gmapT :: (forall b. Data b => b -> b) -> HistogramChartSpecLegendPosition -> HistogramChartSpecLegendPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HistogramChartSpecLegendPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HistogramChartSpecLegendPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> HistogramChartSpecLegendPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HistogramChartSpecLegendPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HistogramChartSpecLegendPosition -> m HistogramChartSpecLegendPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramChartSpecLegendPosition -> m HistogramChartSpecLegendPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramChartSpecLegendPosition -> m HistogramChartSpecLegendPosition #

Ord HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep HistogramChartSpecLegendPosition :: Type -> Type #

Hashable HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep HistogramChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep HistogramChartSpecLegendPosition = D1 (MetaData "HistogramChartSpecLegendPosition" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "HCSLPHistogramChartLegendPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "HCSLPBottomLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HCSLPLeftLegend" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "HCSLPRightLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HCSLPTopLegend" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "HCSLPNoLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HCSLPInsideLegend" PrefixI False) (U1 :: Type -> Type))))

DuplicateSheetRequest

data DuplicateSheetRequest Source #

Duplicates the contents of a sheet.

See: duplicateSheetRequest smart constructor.

Instances
Eq DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DuplicateSheetRequest -> c DuplicateSheetRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DuplicateSheetRequest #

toConstr :: DuplicateSheetRequest -> Constr #

dataTypeOf :: DuplicateSheetRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DuplicateSheetRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DuplicateSheetRequest) #

gmapT :: (forall b. Data b => b -> b) -> DuplicateSheetRequest -> DuplicateSheetRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateSheetRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateSheetRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DuplicateSheetRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DuplicateSheetRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DuplicateSheetRequest -> m DuplicateSheetRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateSheetRequest -> m DuplicateSheetRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateSheetRequest -> m DuplicateSheetRequest #

Show DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DuplicateSheetRequest :: Type -> Type #

ToJSON DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateSheetRequest = D1 (MetaData "DuplicateSheetRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DuplicateSheetRequest'" PrefixI True) ((S1 (MetaSel (Just "_dsrNewSheetName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dsrInsertSheetIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_dsrSourceSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_dsrNewSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

duplicateSheetRequest :: DuplicateSheetRequest Source #

Creates a value of DuplicateSheetRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsrNewSheetName :: Lens' DuplicateSheetRequest (Maybe Text) Source #

The name of the new sheet. If empty, a new name is chosen for you.

dsrInsertSheetIndex :: Lens' DuplicateSheetRequest (Maybe Int32) Source #

The zero-based index where the new sheet should be inserted. The index of all sheets after this are incremented.

dsrNewSheetId :: Lens' DuplicateSheetRequest (Maybe Int32) Source #

If set, the ID of the new sheet. If not set, an ID is chosen. If set, the ID must not conflict with any existing sheet ID. If set, it must be non-negative.

TextRotation

data TextRotation Source #

The rotation applied to text in a cell.

See: textRotation smart constructor.

Instances
Eq TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TextRotation -> c TextRotation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TextRotation #

toConstr :: TextRotation -> Constr #

dataTypeOf :: TextRotation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TextRotation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TextRotation) #

gmapT :: (forall b. Data b => b -> b) -> TextRotation -> TextRotation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TextRotation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TextRotation -> r #

gmapQ :: (forall d. Data d => d -> u) -> TextRotation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TextRotation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TextRotation -> m TextRotation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TextRotation -> m TextRotation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TextRotation -> m TextRotation #

Show TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TextRotation :: Type -> Type #

ToJSON TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextRotation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextRotation = D1 (MetaData "TextRotation" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TextRotation'" PrefixI True) (S1 (MetaSel (Just "_trAngle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_trVertical") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

textRotation :: TextRotation Source #

Creates a value of TextRotation with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

trAngle :: Lens' TextRotation (Maybe Int32) Source #

The angle between the standard orientation and the desired orientation. Measured in degrees. Valid values are between -90 and 90. Positive angles are angled upwards, negative are angled downwards. Note: For LTR text direction positive angles are in the counterclockwise direction, whereas for RTL they are in the clockwise direction

trVertical :: Lens' TextRotation (Maybe Bool) Source #

If true, text reads top to bottom, but the orientation of individual characters is unchanged. For example: | V | | e | | r | | t | | i | | c | | a | | l |

DuplicateFilterViewResponse

data DuplicateFilterViewResponse Source #

The result of a filter view being duplicated.

See: duplicateFilterViewResponse smart constructor.

Instances
Eq DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DuplicateFilterViewResponse -> c DuplicateFilterViewResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DuplicateFilterViewResponse #

toConstr :: DuplicateFilterViewResponse -> Constr #

dataTypeOf :: DuplicateFilterViewResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DuplicateFilterViewResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DuplicateFilterViewResponse) #

gmapT :: (forall b. Data b => b -> b) -> DuplicateFilterViewResponse -> DuplicateFilterViewResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateFilterViewResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateFilterViewResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DuplicateFilterViewResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DuplicateFilterViewResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DuplicateFilterViewResponse -> m DuplicateFilterViewResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateFilterViewResponse -> m DuplicateFilterViewResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateFilterViewResponse -> m DuplicateFilterViewResponse #

Show DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DuplicateFilterViewResponse :: Type -> Type #

ToJSON DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateFilterViewResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateFilterViewResponse = D1 (MetaData "DuplicateFilterViewResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DuplicateFilterViewResponse'" PrefixI True) (S1 (MetaSel (Just "_dfvrFilter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe FilterView))))

duplicateFilterViewResponse :: DuplicateFilterViewResponse Source #

Creates a value of DuplicateFilterViewResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

SheetPropertiesSheetType

data SheetPropertiesSheetType Source #

The type of sheet. Defaults to GRID. This field cannot be changed once set.

Constructors

SheetTypeUnspecified

SHEET_TYPE_UNSPECIFIED Default value, do not use.

Grid

GRID The sheet is a grid.

Object

OBJECT The sheet has no grid and instead has an object like a chart or image.

Instances
Enum SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SheetPropertiesSheetType -> c SheetPropertiesSheetType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SheetPropertiesSheetType #

toConstr :: SheetPropertiesSheetType -> Constr #

dataTypeOf :: SheetPropertiesSheetType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SheetPropertiesSheetType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SheetPropertiesSheetType) #

gmapT :: (forall b. Data b => b -> b) -> SheetPropertiesSheetType -> SheetPropertiesSheetType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SheetPropertiesSheetType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SheetPropertiesSheetType -> r #

gmapQ :: (forall d. Data d => d -> u) -> SheetPropertiesSheetType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SheetPropertiesSheetType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SheetPropertiesSheetType -> m SheetPropertiesSheetType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SheetPropertiesSheetType -> m SheetPropertiesSheetType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SheetPropertiesSheetType -> m SheetPropertiesSheetType #

Ord SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep SheetPropertiesSheetType :: Type -> Type #

Hashable SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SheetPropertiesSheetType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SheetPropertiesSheetType = D1 (MetaData "SheetPropertiesSheetType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SheetTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Grid" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Object" PrefixI False) (U1 :: Type -> Type)))

BatchUpdateValuesRequest

data BatchUpdateValuesRequest Source #

The request for updating more than one range of values in a spreadsheet.

See: batchUpdateValuesRequest smart constructor.

Instances
Eq BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateValuesRequest -> c BatchUpdateValuesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateValuesRequest #

toConstr :: BatchUpdateValuesRequest -> Constr #

dataTypeOf :: BatchUpdateValuesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateValuesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateValuesRequest) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateValuesRequest -> BatchUpdateValuesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateValuesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateValuesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateValuesRequest -> m BatchUpdateValuesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesRequest -> m BatchUpdateValuesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesRequest -> m BatchUpdateValuesRequest #

Show BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchUpdateValuesRequest :: Type -> Type #

ToJSON BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesRequest = D1 (MetaData "BatchUpdateValuesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateValuesRequest'" PrefixI True) ((S1 (MetaSel (Just "_buvrData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ValueRange])) :*: S1 (MetaSel (Just "_buvrValueInputOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesRequestValueInputOption))) :*: (S1 (MetaSel (Just "_buvrIncludeValuesInResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_buvrResponseDateTimeRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesRequestResponseDateTimeRenderOption)) :*: S1 (MetaSel (Just "_buvrResponseValueRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesRequestResponseValueRenderOption))))))

batchUpdateValuesRequest :: BatchUpdateValuesRequest Source #

Creates a value of BatchUpdateValuesRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

buvrData :: Lens' BatchUpdateValuesRequest [ValueRange] Source #

The new values to apply to the spreadsheet.

buvrIncludeValuesInResponse :: Lens' BatchUpdateValuesRequest (Maybe Bool) Source #

Determines if the update response should include the values of the cells that were updated. By default, responses do not include the updated values. The `updatedData` field within each of the BatchUpdateValuesResponse.responses will contain the updated values. If the range to write was larger than than the range actually written, the response will include all values in the requested range (excluding trailing empty rows and columns).

buvrResponseDateTimeRenderOption :: Lens' BatchUpdateValuesRequest (Maybe BatchUpdateValuesRequestResponseDateTimeRenderOption) Source #

Determines how dates, times, and durations in the response should be rendered. This is ignored if response_value_render_option is FORMATTED_VALUE. The default dateTime render option is DateTimeRenderOption.SERIAL_NUMBER.

buvrResponseValueRenderOption :: Lens' BatchUpdateValuesRequest (Maybe BatchUpdateValuesRequestResponseValueRenderOption) Source #

Determines how values in the response should be rendered. The default render option is ValueRenderOption.FORMATTED_VALUE.

DataFilterValueRange

data DataFilterValueRange Source #

A range of values whose location is specified by a DataFilter.

See: dataFilterValueRange smart constructor.

Instances
Eq DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataFilterValueRange -> c DataFilterValueRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataFilterValueRange #

toConstr :: DataFilterValueRange -> Constr #

dataTypeOf :: DataFilterValueRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataFilterValueRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataFilterValueRange) #

gmapT :: (forall b. Data b => b -> b) -> DataFilterValueRange -> DataFilterValueRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataFilterValueRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataFilterValueRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataFilterValueRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataFilterValueRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataFilterValueRange -> m DataFilterValueRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataFilterValueRange -> m DataFilterValueRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataFilterValueRange -> m DataFilterValueRange #

Show DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DataFilterValueRange :: Type -> Type #

ToJSON DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataFilterValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataFilterValueRange = D1 (MetaData "DataFilterValueRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DataFilterValueRange'" PrefixI True) (S1 (MetaSel (Just "_dfvrValues") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [[JSONValue]])) :*: (S1 (MetaSel (Just "_dfvrDataFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DataFilter)) :*: S1 (MetaSel (Just "_dfvrMajorDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DataFilterValueRangeMajorDimension)))))

dataFilterValueRange :: DataFilterValueRange Source #

Creates a value of DataFilterValueRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfvrValues :: Lens' DataFilterValueRange [[JSONValue]] Source #

The data to be written. If the provided values exceed any of the ranges matched by the data filter then the request will fail. If the provided values are less than the matched ranges only the specified values will be written, existing values in the matched ranges will remain unaffected.

dfvrDataFilter :: Lens' DataFilterValueRange (Maybe DataFilter) Source #

The data filter describing the location of the values in the spreadsheet.

AddChartRequest

data AddChartRequest Source #

Adds a chart to a sheet in the spreadsheet.

See: addChartRequest smart constructor.

Instances
Eq AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddChartRequest -> c AddChartRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddChartRequest #

toConstr :: AddChartRequest -> Constr #

dataTypeOf :: AddChartRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddChartRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddChartRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddChartRequest -> AddChartRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddChartRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddChartRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddChartRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddChartRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddChartRequest -> m AddChartRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddChartRequest -> m AddChartRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddChartRequest -> m AddChartRequest #

Show AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddChartRequest :: Type -> Type #

ToJSON AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddChartRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddChartRequest = D1 (MetaData "AddChartRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddChartRequest'" PrefixI True) (S1 (MetaSel (Just "_aChart") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe EmbeddedChart))))

addChartRequest :: AddChartRequest Source #

Creates a value of AddChartRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aChart :: Lens' AddChartRequest (Maybe EmbeddedChart) Source #

The chart that should be added to the spreadsheet, including the position where it should be placed. The chartId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a chart that already exists.)

NamedRange

data NamedRange Source #

A named range.

See: namedRange smart constructor.

Instances
Eq NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NamedRange -> c NamedRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NamedRange #

toConstr :: NamedRange -> Constr #

dataTypeOf :: NamedRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NamedRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NamedRange) #

gmapT :: (forall b. Data b => b -> b) -> NamedRange -> NamedRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NamedRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NamedRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> NamedRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NamedRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NamedRange -> m NamedRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NamedRange -> m NamedRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NamedRange -> m NamedRange #

Show NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep NamedRange :: Type -> Type #

ToJSON NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep NamedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep NamedRange = D1 (MetaData "NamedRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "NamedRange'" PrefixI True) (S1 (MetaSel (Just "_nrNamedRangeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_nrName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_nrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)))))

namedRange :: NamedRange Source #

Creates a value of NamedRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

nrNamedRangeId :: Lens' NamedRange (Maybe Text) Source #

The ID of the named range.

nrName :: Lens' NamedRange (Maybe Text) Source #

The name of the named range.

nrRange :: Lens' NamedRange (Maybe GridRange) Source #

The range this represents.

DeveloperMetadataLookupLocationType

data DeveloperMetadataLookupLocationType Source #

Limits the selected developer metadata to those entries which are associated with locations of the specified type. For example, when this field is specified as ROW this lookup only considers developer metadata associated on rows. If the field is left unspecified, all location types are considered. This field cannot be specified as SPREADSHEET when the locationMatchingStrategy is specified as INTERSECTING or when the metadataLocation is specified as a non-spreadsheet location: spreadsheet metadata cannot intersect any other developer metadata location. This field also must be left unspecified when the locationMatchingStrategy is specified as EXACT.

Constructors

DDeveloperMetadataLocationTypeUnspecified

DEVELOPER_METADATA_LOCATION_TYPE_UNSPECIFIED Default value.

DRow

ROW Developer metadata associated on an entire row dimension.

DColumn

COLUMN Developer metadata associated on an entire column dimension.

DSheet

SHEET Developer metadata associated on an entire sheet.

DSpreadsheet

SPREADSHEET Developer metadata associated on the entire spreadsheet.

Instances
Enum DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadataLookupLocationType -> c DeveloperMetadataLookupLocationType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadataLookupLocationType #

toConstr :: DeveloperMetadataLookupLocationType -> Constr #

dataTypeOf :: DeveloperMetadataLookupLocationType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadataLookupLocationType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadataLookupLocationType) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadataLookupLocationType -> DeveloperMetadataLookupLocationType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookupLocationType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookupLocationType -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadataLookupLocationType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadataLookupLocationType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupLocationType -> m DeveloperMetadataLookupLocationType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupLocationType -> m DeveloperMetadataLookupLocationType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupLocationType -> m DeveloperMetadataLookupLocationType #

Ord DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupLocationType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupLocationType = D1 (MetaData "DeveloperMetadataLookupLocationType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "DDeveloperMetadataLocationTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DRow" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DColumn" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DSheet" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DSpreadsheet" PrefixI False) (U1 :: Type -> Type))))

MergeCellsRequest

data MergeCellsRequest Source #

Merges all cells in the range.

See: mergeCellsRequest smart constructor.

Instances
Eq MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MergeCellsRequest -> c MergeCellsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MergeCellsRequest #

toConstr :: MergeCellsRequest -> Constr #

dataTypeOf :: MergeCellsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MergeCellsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MergeCellsRequest) #

gmapT :: (forall b. Data b => b -> b) -> MergeCellsRequest -> MergeCellsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MergeCellsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MergeCellsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> MergeCellsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MergeCellsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MergeCellsRequest -> m MergeCellsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MergeCellsRequest -> m MergeCellsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MergeCellsRequest -> m MergeCellsRequest #

Show MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep MergeCellsRequest :: Type -> Type #

ToJSON MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MergeCellsRequest = D1 (MetaData "MergeCellsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "MergeCellsRequest'" PrefixI True) (S1 (MetaSel (Just "_mcrMergeType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MergeCellsRequestMergeType)) :*: S1 (MetaSel (Just "_mcrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))))

mergeCellsRequest :: MergeCellsRequest Source #

Creates a value of MergeCellsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mcrRange :: Lens' MergeCellsRequest (Maybe GridRange) Source #

The range of cells to merge.

ManualRule

data ManualRule Source #

Allows you to manually organize the values in a source data column into buckets with names of your choosing. For example, a pivot table that aggregates population by state: +-------+-------------------+ | State | SUM of Population | +-------+-------------------+ | AK | 0.7 | | AL | 4.8 | | AR | 2.9 | ... +-------+-------------------+ could be turned into a pivot table that aggregates population by time zone by providing a list of groups (for example, groupName = 'Central', items = ['AL', 'AR', 'IA', ...]) to a manual group rule. Note that a similar effect could be achieved by adding a time zone column to the source data and adjusting the pivot table. +-----------+-------------------+ | Time Zone | SUM of Population | +-----------+-------------------+ | Central | 106.3 | | Eastern | 151.9 | | Mountain | 17.4 | ... +-----------+-------------------+

See: manualRule smart constructor.

Instances
Eq ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ManualRule -> c ManualRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ManualRule #

toConstr :: ManualRule -> Constr #

dataTypeOf :: ManualRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ManualRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ManualRule) #

gmapT :: (forall b. Data b => b -> b) -> ManualRule -> ManualRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ManualRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ManualRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> ManualRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ManualRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ManualRule -> m ManualRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ManualRule -> m ManualRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ManualRule -> m ManualRule #

Show ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ManualRule :: Type -> Type #

ToJSON ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ManualRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ManualRule = D1 (MetaData "ManualRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "ManualRule'" PrefixI True) (S1 (MetaSel (Just "_mrGroups") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [ManualRuleGroup]))))

manualRule :: ManualRule Source #

Creates a value of ManualRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mrGroups :: Lens' ManualRule [ManualRuleGroup] Source #

The list of group names and the corresponding items from the source data that map to each group name.

MergeCellsRequestMergeType

data MergeCellsRequestMergeType Source #

How the cells should be merged.

Constructors

MergeAll

MERGE_ALL Create a single merge from the range

MergeColumns

MERGE_COLUMNS Create a merge for each column in the range

MergeRows

MERGE_ROWS Create a merge for each row in the range

Instances
Enum MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MergeCellsRequestMergeType -> c MergeCellsRequestMergeType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MergeCellsRequestMergeType #

toConstr :: MergeCellsRequestMergeType -> Constr #

dataTypeOf :: MergeCellsRequestMergeType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MergeCellsRequestMergeType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MergeCellsRequestMergeType) #

gmapT :: (forall b. Data b => b -> b) -> MergeCellsRequestMergeType -> MergeCellsRequestMergeType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MergeCellsRequestMergeType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MergeCellsRequestMergeType -> r #

gmapQ :: (forall d. Data d => d -> u) -> MergeCellsRequestMergeType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MergeCellsRequestMergeType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MergeCellsRequestMergeType -> m MergeCellsRequestMergeType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MergeCellsRequestMergeType -> m MergeCellsRequestMergeType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MergeCellsRequestMergeType -> m MergeCellsRequestMergeType #

Ord MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep MergeCellsRequestMergeType :: Type -> Type #

Hashable MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep MergeCellsRequestMergeType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep MergeCellsRequestMergeType = D1 (MetaData "MergeCellsRequestMergeType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "MergeAll" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "MergeColumns" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "MergeRows" PrefixI False) (U1 :: Type -> Type)))

TextPosition

data TextPosition Source #

Position settings for text.

See: textPosition smart constructor.

Instances
Eq TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TextPosition -> c TextPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TextPosition #

toConstr :: TextPosition -> Constr #

dataTypeOf :: TextPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TextPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TextPosition) #

gmapT :: (forall b. Data b => b -> b) -> TextPosition -> TextPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TextPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TextPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> TextPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TextPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TextPosition -> m TextPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TextPosition -> m TextPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TextPosition -> m TextPosition #

Show TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TextPosition :: Type -> Type #

ToJSON TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextPosition = D1 (MetaData "TextPosition" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "TextPosition'" PrefixI True) (S1 (MetaSel (Just "_tpHorizontalAlignment") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe TextPositionHorizontalAlignment))))

textPosition :: TextPosition Source #

Creates a value of TextPosition with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tpHorizontalAlignment :: Lens' TextPosition (Maybe TextPositionHorizontalAlignment) Source #

Horizontal alignment setting for the piece of text.

CellFormatHorizontalAlignment

data CellFormatHorizontalAlignment Source #

The horizontal alignment of the value in the cell.

Constructors

CFHAHorizontalAlignUnspecified

HORIZONTAL_ALIGN_UNSPECIFIED The horizontal alignment is not specified. Do not use this.

CFHALeft'

LEFT The text is explicitly aligned to the left of the cell.

CFHACenter

CENTER The text is explicitly aligned to the center of the cell.

CFHARight'

RIGHT The text is explicitly aligned to the right of the cell.

Instances
Enum CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellFormatHorizontalAlignment -> c CellFormatHorizontalAlignment #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellFormatHorizontalAlignment #

toConstr :: CellFormatHorizontalAlignment -> Constr #

dataTypeOf :: CellFormatHorizontalAlignment -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellFormatHorizontalAlignment) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellFormatHorizontalAlignment) #

gmapT :: (forall b. Data b => b -> b) -> CellFormatHorizontalAlignment -> CellFormatHorizontalAlignment #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatHorizontalAlignment -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatHorizontalAlignment -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellFormatHorizontalAlignment -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellFormatHorizontalAlignment -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellFormatHorizontalAlignment -> m CellFormatHorizontalAlignment #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatHorizontalAlignment -> m CellFormatHorizontalAlignment #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatHorizontalAlignment -> m CellFormatHorizontalAlignment #

Ord CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CellFormatHorizontalAlignment :: Type -> Type #

Hashable CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatHorizontalAlignment Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatHorizontalAlignment = D1 (MetaData "CellFormatHorizontalAlignment" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "CFHAHorizontalAlignUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CFHALeft'" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "CFHACenter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CFHARight'" PrefixI False) (U1 :: Type -> Type)))

BOrder

data BOrder Source #

A border along a cell.

See: bOrder smart constructor.

Instances
Eq BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

(==) :: BOrder -> BOrder -> Bool #

(/=) :: BOrder -> BOrder -> Bool #

Data BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BOrder -> c BOrder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BOrder #

toConstr :: BOrder -> Constr #

dataTypeOf :: BOrder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BOrder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BOrder) #

gmapT :: (forall b. Data b => b -> b) -> BOrder -> BOrder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BOrder -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BOrder -> r #

gmapQ :: (forall d. Data d => d -> u) -> BOrder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BOrder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BOrder -> m BOrder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BOrder -> m BOrder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BOrder -> m BOrder #

Show BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BOrder :: Type -> Type #

Methods

from :: BOrder -> Rep BOrder x #

to :: Rep BOrder x -> BOrder #

ToJSON BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BOrder = D1 (MetaData "BOrder" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BOrder'" PrefixI True) (S1 (MetaSel (Just "_boStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrderStyle)) :*: (S1 (MetaSel (Just "_boColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_boWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

bOrder :: BOrder Source #

Creates a value of BOrder with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

boStyle :: Lens' BOrder (Maybe BOrderStyle) Source #

The style of the border.

boColor :: Lens' BOrder (Maybe Color) Source #

The color of the border.

boWidth :: Lens' BOrder (Maybe Int32) Source #

The width of the border, in pixels. Deprecated; the width is determined by the "style" field.

SearchDeveloperMetadataRequest

data SearchDeveloperMetadataRequest Source #

A request to retrieve all developer metadata matching the set of specified criteria.

See: searchDeveloperMetadataRequest smart constructor.

Instances
Eq SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SearchDeveloperMetadataRequest -> c SearchDeveloperMetadataRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SearchDeveloperMetadataRequest #

toConstr :: SearchDeveloperMetadataRequest -> Constr #

dataTypeOf :: SearchDeveloperMetadataRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SearchDeveloperMetadataRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SearchDeveloperMetadataRequest) #

gmapT :: (forall b. Data b => b -> b) -> SearchDeveloperMetadataRequest -> SearchDeveloperMetadataRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SearchDeveloperMetadataRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SearchDeveloperMetadataRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> SearchDeveloperMetadataRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SearchDeveloperMetadataRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataRequest -> m SearchDeveloperMetadataRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataRequest -> m SearchDeveloperMetadataRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SearchDeveloperMetadataRequest -> m SearchDeveloperMetadataRequest #

Show SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SearchDeveloperMetadataRequest :: Type -> Type #

ToJSON SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SearchDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SearchDeveloperMetadataRequest = D1 (MetaData "SearchDeveloperMetadataRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "SearchDeveloperMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_sdmrDataFilters") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DataFilter]))))

searchDeveloperMetadataRequest :: SearchDeveloperMetadataRequest Source #

Creates a value of SearchDeveloperMetadataRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sdmrDataFilters :: Lens' SearchDeveloperMetadataRequest [DataFilter] Source #

The data filters describing the criteria used to determine which DeveloperMetadata entries to return. DeveloperMetadata matching any of the specified filters will be included in the response.

CandlestickSeries

data CandlestickSeries Source #

The series of a CandlestickData.

See: candlestickSeries smart constructor.

Instances
Eq CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CandlestickSeries -> c CandlestickSeries #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CandlestickSeries #

toConstr :: CandlestickSeries -> Constr #

dataTypeOf :: CandlestickSeries -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CandlestickSeries) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CandlestickSeries) #

gmapT :: (forall b. Data b => b -> b) -> CandlestickSeries -> CandlestickSeries #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickSeries -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickSeries -> r #

gmapQ :: (forall d. Data d => d -> u) -> CandlestickSeries -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CandlestickSeries -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CandlestickSeries -> m CandlestickSeries #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickSeries -> m CandlestickSeries #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickSeries -> m CandlestickSeries #

Show CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CandlestickSeries :: Type -> Type #

ToJSON CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickSeries = D1 (MetaData "CandlestickSeries" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "CandlestickSeries'" PrefixI True) (S1 (MetaSel (Just "_csData") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ChartData))))

candlestickSeries :: CandlestickSeries Source #

Creates a value of CandlestickSeries with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

csData :: Lens' CandlestickSeries (Maybe ChartData) Source #

The data of the CandlestickSeries.

ExtendedValue

data ExtendedValue Source #

The kinds of value that a cell in a spreadsheet can have.

See: extendedValue smart constructor.

Instances
Eq ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ExtendedValue -> c ExtendedValue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ExtendedValue #

toConstr :: ExtendedValue -> Constr #

dataTypeOf :: ExtendedValue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ExtendedValue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ExtendedValue) #

gmapT :: (forall b. Data b => b -> b) -> ExtendedValue -> ExtendedValue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ExtendedValue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ExtendedValue -> r #

gmapQ :: (forall d. Data d => d -> u) -> ExtendedValue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ExtendedValue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ExtendedValue -> m ExtendedValue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ExtendedValue -> m ExtendedValue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ExtendedValue -> m ExtendedValue #

Show ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ExtendedValue :: Type -> Type #

ToJSON ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ExtendedValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ExtendedValue = D1 (MetaData "ExtendedValue" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ExtendedValue'" PrefixI True) ((S1 (MetaSel (Just "_evBoolValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_evNumberValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double)))) :*: (S1 (MetaSel (Just "_evErrorValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ErrorValue)) :*: (S1 (MetaSel (Just "_evStringValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_evFormulaValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

extendedValue :: ExtendedValue Source #

Creates a value of ExtendedValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

evBoolValue :: Lens' ExtendedValue (Maybe Bool) Source #

Represents a boolean value.

evNumberValue :: Lens' ExtendedValue (Maybe Double) Source #

Represents a double value. Note: Dates, Times and DateTimes are represented as doubles in "serial number" format.

evErrorValue :: Lens' ExtendedValue (Maybe ErrorValue) Source #

Represents an error. This field is read-only.

evStringValue :: Lens' ExtendedValue (Maybe Text) Source #

Represents a string value. Leading single quotes are not included. For example, if the user typed `'123` into the UI, this would be represented as a `stringValue` of `"123"`.

evFormulaValue :: Lens' ExtendedValue (Maybe Text) Source #

Represents a formula.

AddNamedRangeRequest

data AddNamedRangeRequest Source #

Adds a named range to the spreadsheet.

See: addNamedRangeRequest smart constructor.

Instances
Eq AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddNamedRangeRequest -> c AddNamedRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddNamedRangeRequest #

toConstr :: AddNamedRangeRequest -> Constr #

dataTypeOf :: AddNamedRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddNamedRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddNamedRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddNamedRangeRequest -> AddNamedRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddNamedRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddNamedRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddNamedRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddNamedRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddNamedRangeRequest -> m AddNamedRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddNamedRangeRequest -> m AddNamedRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddNamedRangeRequest -> m AddNamedRangeRequest #

Show AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddNamedRangeRequest :: Type -> Type #

ToJSON AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddNamedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddNamedRangeRequest = D1 (MetaData "AddNamedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddNamedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_aNamedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe NamedRange))))

addNamedRangeRequest :: AddNamedRangeRequest Source #

Creates a value of AddNamedRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aNamedRange :: Lens' AddNamedRangeRequest (Maybe NamedRange) Source #

The named range to add. The namedRangeId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a range that already exists.)

WaterfallChartSpecStackedType

data WaterfallChartSpecStackedType Source #

The stacked type.

Constructors

WCSSTWaterfallStackedTypeUnspecified

WATERFALL_STACKED_TYPE_UNSPECIFIED Default value, do not use.

WCSSTStacked

STACKED Values corresponding to the same domain (horizontal axis) value will be stacked vertically.

WCSSTSequential

SEQUENTIAL Series will spread out along the horizontal axis.

Instances
Enum WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartSpecStackedType -> c WaterfallChartSpecStackedType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartSpecStackedType #

toConstr :: WaterfallChartSpecStackedType -> Constr #

dataTypeOf :: WaterfallChartSpecStackedType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartSpecStackedType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartSpecStackedType) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartSpecStackedType -> WaterfallChartSpecStackedType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSpecStackedType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSpecStackedType -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartSpecStackedType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartSpecStackedType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartSpecStackedType -> m WaterfallChartSpecStackedType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSpecStackedType -> m WaterfallChartSpecStackedType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSpecStackedType -> m WaterfallChartSpecStackedType #

Ord WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep WaterfallChartSpecStackedType :: Type -> Type #

Hashable WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep WaterfallChartSpecStackedType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep WaterfallChartSpecStackedType = D1 (MetaData "WaterfallChartSpecStackedType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WCSSTWaterfallStackedTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "WCSSTStacked" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "WCSSTSequential" PrefixI False) (U1 :: Type -> Type)))

PivotFilterCriteria

data PivotFilterCriteria Source #

Criteria for showing/hiding rows in a pivot table.

See: pivotFilterCriteria smart constructor.

Instances
Eq PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotFilterCriteria -> c PivotFilterCriteria #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotFilterCriteria #

toConstr :: PivotFilterCriteria -> Constr #

dataTypeOf :: PivotFilterCriteria -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotFilterCriteria) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotFilterCriteria) #

gmapT :: (forall b. Data b => b -> b) -> PivotFilterCriteria -> PivotFilterCriteria #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotFilterCriteria -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotFilterCriteria -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotFilterCriteria -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotFilterCriteria -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotFilterCriteria -> m PivotFilterCriteria #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotFilterCriteria -> m PivotFilterCriteria #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotFilterCriteria -> m PivotFilterCriteria #

Show PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotFilterCriteria :: Type -> Type #

ToJSON PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotFilterCriteria Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotFilterCriteria = D1 (MetaData "PivotFilterCriteria" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "PivotFilterCriteria'" PrefixI True) (S1 (MetaSel (Just "_pfcVisibleValues") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [Text]))))

pivotFilterCriteria :: PivotFilterCriteria Source #

Creates a value of PivotFilterCriteria with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pfcVisibleValues :: Lens' PivotFilterCriteria [Text] Source #

Values that should be included. Values not listed here are excluded.

DimensionRange

data DimensionRange Source #

A range along a single dimension on a sheet. All indexes are zero-based. Indexes are half open: the start index is inclusive and the end index is exclusive. Missing indexes indicate the range is unbounded on that side.

See: dimensionRange smart constructor.

Instances
Eq DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DimensionRange -> c DimensionRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DimensionRange #

toConstr :: DimensionRange -> Constr #

dataTypeOf :: DimensionRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DimensionRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DimensionRange) #

gmapT :: (forall b. Data b => b -> b) -> DimensionRange -> DimensionRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DimensionRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DimensionRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> DimensionRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DimensionRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DimensionRange -> m DimensionRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionRange -> m DimensionRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionRange -> m DimensionRange #

Show DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DimensionRange :: Type -> Type #

ToJSON DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionRange = D1 (MetaData "DimensionRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DimensionRange'" PrefixI True) ((S1 (MetaSel (Just "_drDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DimensionRangeDimension)) :*: S1 (MetaSel (Just "_drEndIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_drSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_drStartIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

dimensionRange :: DimensionRange Source #

Creates a value of DimensionRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

drEndIndex :: Lens' DimensionRange (Maybe Int32) Source #

The end (exclusive) of the span, or not set if unbounded.

drSheetId :: Lens' DimensionRange (Maybe Int32) Source #

The sheet this span is on.

drStartIndex :: Lens' DimensionRange (Maybe Int32) Source #

The start (inclusive) of the span, or not set if unbounded.

UpdateSpreadsheetPropertiesRequest

data UpdateSpreadsheetPropertiesRequest Source #

Updates properties of a spreadsheet.

See: updateSpreadsheetPropertiesRequest smart constructor.

Instances
Eq UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateSpreadsheetPropertiesRequest -> c UpdateSpreadsheetPropertiesRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateSpreadsheetPropertiesRequest #

toConstr :: UpdateSpreadsheetPropertiesRequest -> Constr #

dataTypeOf :: UpdateSpreadsheetPropertiesRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateSpreadsheetPropertiesRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateSpreadsheetPropertiesRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateSpreadsheetPropertiesRequest -> UpdateSpreadsheetPropertiesRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateSpreadsheetPropertiesRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateSpreadsheetPropertiesRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateSpreadsheetPropertiesRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateSpreadsheetPropertiesRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateSpreadsheetPropertiesRequest -> m UpdateSpreadsheetPropertiesRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateSpreadsheetPropertiesRequest -> m UpdateSpreadsheetPropertiesRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateSpreadsheetPropertiesRequest -> m UpdateSpreadsheetPropertiesRequest #

Show UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateSpreadsheetPropertiesRequest :: Type -> Type #

ToJSON UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateSpreadsheetPropertiesRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateSpreadsheetPropertiesRequest = D1 (MetaData "UpdateSpreadsheetPropertiesRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateSpreadsheetPropertiesRequest'" PrefixI True) (S1 (MetaSel (Just "_uFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)) :*: S1 (MetaSel (Just "_uProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SpreadsheetProperties))))

updateSpreadsheetPropertiesRequest :: UpdateSpreadsheetPropertiesRequest Source #

Creates a value of UpdateSpreadsheetPropertiesRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uFields :: Lens' UpdateSpreadsheetPropertiesRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root 'properties' is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

DateTimeRuleType

data DateTimeRuleType Source #

The type of date-time grouping to apply.

Constructors

DateTimeRuleTypeUnspecified

DATE_TIME_RULE_TYPE_UNSPECIFIED The default type, do not use.

Second

SECOND Group dates by second, from 0 to 59.

Minute

MINUTE Group dates by minute, from 0 to 59.

Hour

HOUR Group dates by hour using a 24-hour system, from 0 to 23.

HourMinute

HOUR_MINUTE Group dates by hour and minute using a 24-hour system, for example 19:45.

HourMinuteAmpm

HOUR_MINUTE_AMPM Group dates by hour and minute using a 12-hour system, for example 7:45 PM. The AM/PM designation is translated based on the spreadsheet locale.

DayOfWeek

DAY_OF_WEEK Group dates by day of week, for example Sunday. The days of the week will be translated based on the spreadsheet locale.

DayOfYear

DAY_OF_YEAR Group dates by day of year, from 1 to 366. Note that dates after Feb. 29 fall in different buckets in leap years than in non-leap years.

DayOfMonth

DAY_OF_MONTH Group dates by day of month, from 1 to 31.

DayMonth

DAY_MONTH Group dates by day and month, for example 22-Nov. The month is translated based on the spreadsheet locale.

Month

MONTH Group dates by month, for example Nov. The month is translated based on the spreadsheet locale.

Quarter

QUARTER Group dates by quarter, for example Q1 (which represents Jan-Mar).

Year

YEAR Group dates by year, for example 2008.

YearMonth

YEAR_MONTH Group dates by year and month, for example 2008-Nov. The month is translated based on the spreadsheet locale.

YearQuarter

YEAR_QUARTER Group dates by year and quarter, for example 2008 Q4.

YearMonthDay

YEAR_MONTH_DAY Group dates by year, month, and day, for example 2008-11-22.

Instances
Enum DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DateTimeRuleType -> c DateTimeRuleType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DateTimeRuleType #

toConstr :: DateTimeRuleType -> Constr #

dataTypeOf :: DateTimeRuleType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DateTimeRuleType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DateTimeRuleType) #

gmapT :: (forall b. Data b => b -> b) -> DateTimeRuleType -> DateTimeRuleType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DateTimeRuleType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DateTimeRuleType -> r #

gmapQ :: (forall d. Data d => d -> u) -> DateTimeRuleType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DateTimeRuleType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DateTimeRuleType -> m DateTimeRuleType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DateTimeRuleType -> m DateTimeRuleType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DateTimeRuleType -> m DateTimeRuleType #

Ord DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DateTimeRuleType :: Type -> Type #

Hashable DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DateTimeRuleType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DateTimeRuleType = D1 (MetaData "DateTimeRuleType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((((C1 (MetaCons "DateTimeRuleTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Second" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Minute" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Hour" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "HourMinute" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "HourMinuteAmpm" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DayOfWeek" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DayOfYear" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "DayOfMonth" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DayMonth" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Month" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Quarter" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Year" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "YearMonth" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "YearQuarter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "YearMonthDay" PrefixI False) (U1 :: Type -> Type)))))

DeveloperMetadataLookupVisibility

data DeveloperMetadataLookupVisibility Source #

Limits the selected developer metadata to that which has a matching DeveloperMetadata.visibility. If left unspecified, all developer metadata visibile to the requesting project is considered.

Constructors

DMLVDeveloperMetadataVisibilityUnspecified

DEVELOPER_METADATA_VISIBILITY_UNSPECIFIED Default value.

DMLVDocument

DOCUMENT Document-visible metadata is accessible from any developer project with access to the document.

DMLVProject

PROJECT Project-visible metadata is only visible to and accessible by the developer project that created the metadata.

Instances
Enum DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadataLookupVisibility -> c DeveloperMetadataLookupVisibility #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadataLookupVisibility #

toConstr :: DeveloperMetadataLookupVisibility -> Constr #

dataTypeOf :: DeveloperMetadataLookupVisibility -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadataLookupVisibility) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadataLookupVisibility) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadataLookupVisibility -> DeveloperMetadataLookupVisibility #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookupVisibility -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadataLookupVisibility -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadataLookupVisibility -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadataLookupVisibility -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupVisibility -> m DeveloperMetadataLookupVisibility #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupVisibility -> m DeveloperMetadataLookupVisibility #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadataLookupVisibility -> m DeveloperMetadataLookupVisibility #

Ord DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep DeveloperMetadataLookupVisibility :: Type -> Type #

Hashable DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupVisibility Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep DeveloperMetadataLookupVisibility = D1 (MetaData "DeveloperMetadataLookupVisibility" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DMLVDeveloperMetadataVisibilityUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DMLVDocument" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DMLVProject" PrefixI False) (U1 :: Type -> Type)))

CandlestickDomain

data CandlestickDomain Source #

The domain of a CandlestickChart.

See: candlestickDomain smart constructor.

Instances
Eq CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CandlestickDomain -> c CandlestickDomain #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CandlestickDomain #

toConstr :: CandlestickDomain -> Constr #

dataTypeOf :: CandlestickDomain -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CandlestickDomain) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CandlestickDomain) #

gmapT :: (forall b. Data b => b -> b) -> CandlestickDomain -> CandlestickDomain #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickDomain -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickDomain -> r #

gmapQ :: (forall d. Data d => d -> u) -> CandlestickDomain -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CandlestickDomain -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CandlestickDomain -> m CandlestickDomain #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickDomain -> m CandlestickDomain #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickDomain -> m CandlestickDomain #

Show CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CandlestickDomain :: Type -> Type #

ToJSON CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickDomain = D1 (MetaData "CandlestickDomain" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CandlestickDomain'" PrefixI True) (S1 (MetaSel (Just "_cdReversed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_cdData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))

candlestickDomain :: CandlestickDomain Source #

Creates a value of CandlestickDomain with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cdReversed :: Lens' CandlestickDomain (Maybe Bool) Source #

True to reverse the order of the domain values (horizontal axis).

cdData :: Lens' CandlestickDomain (Maybe ChartData) Source #

The data of the CandlestickDomain.

AddProtectedRangeResponse

data AddProtectedRangeResponse Source #

The result of adding a new protected range.

See: addProtectedRangeResponse smart constructor.

Instances
Eq AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddProtectedRangeResponse -> c AddProtectedRangeResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddProtectedRangeResponse #

toConstr :: AddProtectedRangeResponse -> Constr #

dataTypeOf :: AddProtectedRangeResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddProtectedRangeResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddProtectedRangeResponse) #

gmapT :: (forall b. Data b => b -> b) -> AddProtectedRangeResponse -> AddProtectedRangeResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddProtectedRangeResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddProtectedRangeResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddProtectedRangeResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddProtectedRangeResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddProtectedRangeResponse -> m AddProtectedRangeResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddProtectedRangeResponse -> m AddProtectedRangeResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddProtectedRangeResponse -> m AddProtectedRangeResponse #

Show AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddProtectedRangeResponse :: Type -> Type #

ToJSON AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddProtectedRangeResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddProtectedRangeResponse = D1 (MetaData "AddProtectedRangeResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddProtectedRangeResponse'" PrefixI True) (S1 (MetaSel (Just "_aProtectedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ProtectedRange))))

addProtectedRangeResponse :: AddProtectedRangeResponse Source #

Creates a value of AddProtectedRangeResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

AppendDimensionRequest

data AppendDimensionRequest Source #

Appends rows or columns to the end of a sheet.

See: appendDimensionRequest smart constructor.

Instances
Eq AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AppendDimensionRequest -> c AppendDimensionRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AppendDimensionRequest #

toConstr :: AppendDimensionRequest -> Constr #

dataTypeOf :: AppendDimensionRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AppendDimensionRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AppendDimensionRequest) #

gmapT :: (forall b. Data b => b -> b) -> AppendDimensionRequest -> AppendDimensionRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AppendDimensionRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AppendDimensionRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AppendDimensionRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AppendDimensionRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AppendDimensionRequest -> m AppendDimensionRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AppendDimensionRequest -> m AppendDimensionRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AppendDimensionRequest -> m AppendDimensionRequest #

Show AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AppendDimensionRequest :: Type -> Type #

ToJSON AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendDimensionRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AppendDimensionRequest = D1 (MetaData "AppendDimensionRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "AppendDimensionRequest'" PrefixI True) (S1 (MetaSel (Just "_adrLength") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_adrDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AppendDimensionRequestDimension)) :*: S1 (MetaSel (Just "_adrSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

appendDimensionRequest :: AppendDimensionRequest Source #

Creates a value of AppendDimensionRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

adrLength :: Lens' AppendDimensionRequest (Maybe Int32) Source #

The number of rows or columns to append.

adrSheetId :: Lens' AppendDimensionRequest (Maybe Int32) Source #

The sheet to append rows or columns to.

PivotValue

data PivotValue Source #

The definition of how a value in a pivot table should be calculated.

See: pivotValue smart constructor.

Instances
Eq PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotValue -> c PivotValue #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotValue #

toConstr :: PivotValue -> Constr #

dataTypeOf :: PivotValue -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotValue) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotValue) #

gmapT :: (forall b. Data b => b -> b) -> PivotValue -> PivotValue #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotValue -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotValue -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotValue -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotValue -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotValue -> m PivotValue #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValue -> m PivotValue #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValue -> m PivotValue #

Show PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotValue :: Type -> Type #

ToJSON PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotValue Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotValue = D1 (MetaData "PivotValue" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PivotValue'" PrefixI True) ((S1 (MetaSel (Just "_pvSourceColumnOffSet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_pvFormula") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_pvName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_pvCalculatedDisplayType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PivotValueCalculatedDisplayType)) :*: S1 (MetaSel (Just "_pvSummarizeFunction") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PivotValueSummarizeFunction))))))

pivotValue :: PivotValue Source #

Creates a value of PivotValue with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pvSourceColumnOffSet :: Lens' PivotValue (Maybe Int32) Source #

The column offset of the source range that this value reads from. For example, if the source was `C10:E15`, a `sourceColumnOffset` of `0` means this value refers to column `C`, whereas the offset `1` would refer to column `D`.

pvFormula :: Lens' PivotValue (Maybe Text) Source #

A custom formula to calculate the value. The formula must start with an `=` character.

pvName :: Lens' PivotValue (Maybe Text) Source #

A name to use for the value.

pvCalculatedDisplayType :: Lens' PivotValue (Maybe PivotValueCalculatedDisplayType) Source #

If specified, indicates that pivot values should be displayed as the result of a calculation with another pivot value. For example, if calculated_display_type is specified as PERCENT_OF_GRAND_TOTAL, all the pivot values are displayed as the percentage of the grand total. In the Sheets UI, this is referred to as "Show As" in the value section of a pivot table.

pvSummarizeFunction :: Lens' PivotValue (Maybe PivotValueSummarizeFunction) Source #

A function to summarize the value. If formula is set, the only supported values are SUM and CUSTOM. If sourceColumnOffset is set, then `CUSTOM` is not supported.

BasicChartSpecCompareMode

data BasicChartSpecCompareMode Source #

The behavior of tooltips and data highlighting when hovering on data and chart area.

Constructors

BasicChartCompareModeUnspecified

BASIC_CHART_COMPARE_MODE_UNSPECIFIED Default value, do not use.

Datum

DATUM Only the focused data element is highlighted and shown in the tooltip.

Category

CATEGORY All data elements with the same category (e.g., domain value) are highlighted and shown in the tooltip.

Instances
Enum BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSpecCompareMode -> c BasicChartSpecCompareMode #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSpecCompareMode #

toConstr :: BasicChartSpecCompareMode -> Constr #

dataTypeOf :: BasicChartSpecCompareMode -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSpecCompareMode) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSpecCompareMode) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSpecCompareMode -> BasicChartSpecCompareMode #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecCompareMode -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecCompareMode -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSpecCompareMode -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSpecCompareMode -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSpecCompareMode -> m BasicChartSpecCompareMode #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecCompareMode -> m BasicChartSpecCompareMode #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecCompareMode -> m BasicChartSpecCompareMode #

Ord BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSpecCompareMode :: Type -> Type #

Hashable BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecCompareMode Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecCompareMode = D1 (MetaData "BasicChartSpecCompareMode" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BasicChartCompareModeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "Datum" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Category" PrefixI False) (U1 :: Type -> Type)))

UnmergeCellsRequest

data UnmergeCellsRequest Source #

Unmerges cells in the given range.

See: unmergeCellsRequest smart constructor.

Instances
Eq UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UnmergeCellsRequest -> c UnmergeCellsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UnmergeCellsRequest #

toConstr :: UnmergeCellsRequest -> Constr #

dataTypeOf :: UnmergeCellsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UnmergeCellsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UnmergeCellsRequest) #

gmapT :: (forall b. Data b => b -> b) -> UnmergeCellsRequest -> UnmergeCellsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UnmergeCellsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UnmergeCellsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UnmergeCellsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UnmergeCellsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UnmergeCellsRequest -> m UnmergeCellsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UnmergeCellsRequest -> m UnmergeCellsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UnmergeCellsRequest -> m UnmergeCellsRequest #

Show UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UnmergeCellsRequest :: Type -> Type #

ToJSON UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UnmergeCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UnmergeCellsRequest = D1 (MetaData "UnmergeCellsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "UnmergeCellsRequest'" PrefixI True) (S1 (MetaSel (Just "_ucrRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe GridRange))))

unmergeCellsRequest :: UnmergeCellsRequest Source #

Creates a value of UnmergeCellsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ucrRange :: Lens' UnmergeCellsRequest (Maybe GridRange) Source #

The range within which all cells should be unmerged. If the range spans multiple merges, all will be unmerged. The range must not partially span any merge.

DeleteSheetRequest

data DeleteSheetRequest Source #

Deletes the requested sheet.

See: deleteSheetRequest smart constructor.

Instances
Eq DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteSheetRequest -> c DeleteSheetRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteSheetRequest #

toConstr :: DeleteSheetRequest -> Constr #

dataTypeOf :: DeleteSheetRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteSheetRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteSheetRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteSheetRequest -> DeleteSheetRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteSheetRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteSheetRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteSheetRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteSheetRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteSheetRequest -> m DeleteSheetRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteSheetRequest -> m DeleteSheetRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteSheetRequest -> m DeleteSheetRequest #

Show DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteSheetRequest :: Type -> Type #

ToJSON DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteSheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteSheetRequest = D1 (MetaData "DeleteSheetRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteSheetRequest'" PrefixI True) (S1 (MetaSel (Just "_dsrSheetId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

deleteSheetRequest :: DeleteSheetRequest Source #

Creates a value of DeleteSheetRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsrSheetId :: Lens' DeleteSheetRequest (Maybe Int32) Source #

The ID of the sheet to delete.

BooleanConditionType

data BooleanConditionType Source #

The type of condition.

Constructors

ConditionTypeUnspecified

CONDITION_TYPE_UNSPECIFIED The default value, do not use.

NumberGreater

NUMBER_GREATER The cell's value must be greater than the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberGreaterThanEQ

NUMBER_GREATER_THAN_EQ The cell's value must be greater than or equal to the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberLess

NUMBER_LESS The cell's value must be less than the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberLessThanEQ

NUMBER_LESS_THAN_EQ The cell's value must be less than or equal to the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberEQ

NUMBER_EQ The cell's value must be equal to the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberNotEQ

NUMBER_NOT_EQ The cell's value must be not equal to the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

NumberBetween

NUMBER_BETWEEN The cell's value must be between the two condition values. Supported by data validation, conditional formatting and filters. Requires exactly two ConditionValues.

NumberNotBetween

NUMBER_NOT_BETWEEN The cell's value must not be between the two condition values. Supported by data validation, conditional formatting and filters. Requires exactly two ConditionValues.

TextContains

TEXT_CONTAINS The cell's value must contain the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

TextNotContains

TEXT_NOT_CONTAINS The cell's value must not contain the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

TextStartsWith

TEXT_STARTS_WITH The cell's value must start with the condition's value. Supported by conditional formatting and filters. Requires a single ConditionValue.

TextEndsWith

TEXT_ENDS_WITH The cell's value must end with the condition's value. Supported by conditional formatting and filters. Requires a single ConditionValue.

TextEQ

TEXT_EQ The cell's value must be exactly the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

TextIsEmail

TEXT_IS_EMAIL The cell's value must be a valid email address. Supported by data validation. Requires no ConditionValues.

TextIsURL

TEXT_IS_URL The cell's value must be a valid URL. Supported by data validation. Requires no ConditionValues.

DateEQ

DATE_EQ The cell's value must be the same date as the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

DateBefore

DATE_BEFORE The cell's value must be before the date of the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue that may be a relative date.

DateAfter

DATE_AFTER The cell's value must be after the date of the condition's value. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue that may be a relative date.

DateOnOrBefore

DATE_ON_OR_BEFORE The cell's value must be on or before the date of the condition's value. Supported by data validation. Requires a single ConditionValue that may be a relative date.

DateOnOrAfter

DATE_ON_OR_AFTER The cell's value must be on or after the date of the condition's value. Supported by data validation. Requires a single ConditionValue that may be a relative date.

DateBetween

DATE_BETWEEN The cell's value must be between the dates of the two condition values. Supported by data validation. Requires exactly two ConditionValues.

DateNotBetween

DATE_NOT_BETWEEN The cell's value must be outside the dates of the two condition values. Supported by data validation. Requires exactly two ConditionValues.

DateIsValid

DATE_IS_VALID The cell's value must be a date. Supported by data validation. Requires no ConditionValues.

OneOfRange

ONE_OF_RANGE The cell's value must be listed in the grid in condition value's range. Supported by data validation. Requires a single ConditionValue, and the value must be a valid range in A1 notation.

OneOfList

ONE_OF_LIST The cell's value must be in the list of condition values. Supported by data validation. Supports any number of condition values, one per item in the list. Formulas are not supported in the values.

Blank

BLANK The cell's value must be empty. Supported by conditional formatting and filters. Requires no ConditionValues.

NotBlank

NOT_BLANK The cell's value must not be empty. Supported by conditional formatting and filters. Requires no ConditionValues.

CustomFormula

CUSTOM_FORMULA The condition's formula must evaluate to true. Supported by data validation, conditional formatting and filters. Requires a single ConditionValue.

Boolean

BOOLEAN The cell's value must be TRUE/FALSE or in the list of condition values. Supported by data validation. Renders as a cell checkbox. Supports zero, one or two ConditionValues. No values indicates the cell must be TRUE or FALSE, where TRUE renders as checked and FALSE renders as unchecked. One value indicates the cell will render as checked when it contains that value and unchecked when it is blank. Two values indicate that the cell will render as checked when it contains the first value and unchecked when it contains the second value. For example, ["Yes","No"] indicates that the cell will render a checked box when it has the value "Yes" and an unchecked box when it has the value "No".

Instances
Enum BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BooleanConditionType -> c BooleanConditionType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BooleanConditionType #

toConstr :: BooleanConditionType -> Constr #

dataTypeOf :: BooleanConditionType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BooleanConditionType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BooleanConditionType) #

gmapT :: (forall b. Data b => b -> b) -> BooleanConditionType -> BooleanConditionType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BooleanConditionType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BooleanConditionType -> r #

gmapQ :: (forall d. Data d => d -> u) -> BooleanConditionType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BooleanConditionType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BooleanConditionType -> m BooleanConditionType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanConditionType -> m BooleanConditionType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BooleanConditionType -> m BooleanConditionType #

Ord BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BooleanConditionType :: Type -> Type #

Hashable BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BooleanConditionType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BooleanConditionType = D1 (MetaData "BooleanConditionType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((((C1 (MetaCons "ConditionTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NumberGreater" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NumberGreaterThanEQ" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "NumberLess" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NumberLessThanEQ" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NumberEQ" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NumberNotEQ" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "NumberBetween" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NumberNotBetween" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TextContains" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextNotContains" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "TextStartsWith" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextEndsWith" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TextEQ" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TextIsEmail" PrefixI False) (U1 :: Type -> Type))))) :+: (((C1 (MetaCons "TextIsURL" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DateEQ" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DateBefore" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "DateAfter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DateOnOrBefore" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "DateOnOrAfter" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DateBetween" PrefixI False) (U1 :: Type -> Type)))) :+: (((C1 (MetaCons "DateNotBetween" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "DateIsValid" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "OneOfRange" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "OneOfList" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Blank" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "NotBlank" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "CustomFormula" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Boolean" PrefixI False) (U1 :: Type -> Type))))))

AddDimensionGroupRequest

data AddDimensionGroupRequest Source #

Creates a group over the specified range. If the requested range is a superset of the range of an existing group G, then the depth of G is incremented and this new group G' has the depth of that group. For example, a group [C:D, depth 1] + [B:E] results in groups [B:E, depth 1] and [C:D, depth 2]. If the requested range is a subset of the range of an existing group G, then the depth of the new group G' becomes one greater than the depth of G. For example, a group [B:E, depth 1] + [C:D] results in groups [B:E, depth 1] and [C:D, depth 2]. If the requested range starts before and ends within, or starts within and ends after, the range of an existing group G, then the range of the existing group G becomes the union of the ranges, and the new group G' has depth one greater than the depth of G and range as the intersection of the ranges. For example, a group [B:D, depth 1] + [C:E] results in groups [B:E, depth 1] and [C:D, depth 2].

See: addDimensionGroupRequest smart constructor.

Instances
Eq AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddDimensionGroupRequest -> c AddDimensionGroupRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddDimensionGroupRequest #

toConstr :: AddDimensionGroupRequest -> Constr #

dataTypeOf :: AddDimensionGroupRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddDimensionGroupRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddDimensionGroupRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddDimensionGroupRequest -> AddDimensionGroupRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddDimensionGroupRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddDimensionGroupRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddDimensionGroupRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddDimensionGroupRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddDimensionGroupRequest -> m AddDimensionGroupRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddDimensionGroupRequest -> m AddDimensionGroupRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddDimensionGroupRequest -> m AddDimensionGroupRequest #

Show AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddDimensionGroupRequest :: Type -> Type #

ToJSON AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddDimensionGroupRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddDimensionGroupRequest = D1 (MetaData "AddDimensionGroupRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddDimensionGroupRequest'" PrefixI True) (S1 (MetaSel (Just "_adgrRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DimensionRange))))

addDimensionGroupRequest :: AddDimensionGroupRequest Source #

Creates a value of AddDimensionGroupRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

adgrRange :: Lens' AddDimensionGroupRequest (Maybe DimensionRange) Source #

The range over which to create a group.

WaterfallChartColumnStyle

data WaterfallChartColumnStyle Source #

Styles for a waterfall chart column.

See: waterfallChartColumnStyle smart constructor.

Instances
Eq WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartColumnStyle -> c WaterfallChartColumnStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartColumnStyle #

toConstr :: WaterfallChartColumnStyle -> Constr #

dataTypeOf :: WaterfallChartColumnStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartColumnStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartColumnStyle) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartColumnStyle -> WaterfallChartColumnStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartColumnStyle -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartColumnStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartColumnStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartColumnStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartColumnStyle -> m WaterfallChartColumnStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartColumnStyle -> m WaterfallChartColumnStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartColumnStyle -> m WaterfallChartColumnStyle #

Show WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep WaterfallChartColumnStyle :: Type -> Type #

ToJSON WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartColumnStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartColumnStyle = D1 (MetaData "WaterfallChartColumnStyle" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WaterfallChartColumnStyle'" PrefixI True) (S1 (MetaSel (Just "_wColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_wLabel") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

waterfallChartColumnStyle :: WaterfallChartColumnStyle Source #

Creates a value of WaterfallChartColumnStyle with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wLabel :: Lens' WaterfallChartColumnStyle (Maybe Text) Source #

The label of the column's legend.

CandlestickData

data CandlestickData Source #

The Candlestick chart data, each containing the low, open, close, and high values for a series.

See: candlestickData smart constructor.

Instances
Eq CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CandlestickData -> c CandlestickData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CandlestickData #

toConstr :: CandlestickData -> Constr #

dataTypeOf :: CandlestickData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CandlestickData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CandlestickData) #

gmapT :: (forall b. Data b => b -> b) -> CandlestickData -> CandlestickData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickData -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CandlestickData -> r #

gmapQ :: (forall d. Data d => d -> u) -> CandlestickData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CandlestickData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CandlestickData -> m CandlestickData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickData -> m CandlestickData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CandlestickData -> m CandlestickData #

Show CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CandlestickData :: Type -> Type #

ToJSON CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CandlestickData = D1 (MetaData "CandlestickData" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CandlestickData'" PrefixI True) ((S1 (MetaSel (Just "_cdLowSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickSeries)) :*: S1 (MetaSel (Just "_cdHighSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickSeries))) :*: (S1 (MetaSel (Just "_cdOpenSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickSeries)) :*: S1 (MetaSel (Just "_cdCloseSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickSeries)))))

candlestickData :: CandlestickData Source #

Creates a value of CandlestickData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cdLowSeries :: Lens' CandlestickData (Maybe CandlestickSeries) Source #

The range data (vertical axis) for the low/minimum value for each candle. This is the bottom of the candle's center line.

cdHighSeries :: Lens' CandlestickData (Maybe CandlestickSeries) Source #

The range data (vertical axis) for the high/maximum value for each candle. This is the top of the candle's center line.

cdOpenSeries :: Lens' CandlestickData (Maybe CandlestickSeries) Source #

The range data (vertical axis) for the open/initial value for each candle. This is the bottom of the candle body. If less than the close value the candle will be filled. Otherwise the candle will be hollow.

cdCloseSeries :: Lens' CandlestickData (Maybe CandlestickSeries) Source #

The range data (vertical axis) for the close/final value for each candle. This is the top of the candle body. If greater than the open value the candle will be filled. Otherwise the candle will be hollow.

BandedRange

data BandedRange Source #

A banded (alternating colors) range in a sheet.

See: bandedRange smart constructor.

Instances
Eq BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BandedRange -> c BandedRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BandedRange #

toConstr :: BandedRange -> Constr #

dataTypeOf :: BandedRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BandedRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BandedRange) #

gmapT :: (forall b. Data b => b -> b) -> BandedRange -> BandedRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BandedRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BandedRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> BandedRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BandedRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BandedRange -> m BandedRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BandedRange -> m BandedRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BandedRange -> m BandedRange #

Show BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BandedRange :: Type -> Type #

ToJSON BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BandedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BandedRange = D1 (MetaData "BandedRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BandedRange'" PrefixI True) ((S1 (MetaSel (Just "_brBandedRangeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_brRowProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BandingProperties))) :*: (S1 (MetaSel (Just "_brRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_brColumnProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BandingProperties)))))

bandedRange :: BandedRange Source #

Creates a value of BandedRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

brBandedRangeId :: Lens' BandedRange (Maybe Int32) Source #

The id of the banded range.

brRowProperties :: Lens' BandedRange (Maybe BandingProperties) Source #

Properties for row bands. These properties are applied on a row-by-row basis throughout all the rows in the range. At least one of row_properties or column_properties must be specified.

brRange :: Lens' BandedRange (Maybe GridRange) Source #

The range over which these properties are applied.

brColumnProperties :: Lens' BandedRange (Maybe BandingProperties) Source #

Properties for column bands. These properties are applied on a column- by-column basis throughout all the columns in the range. At least one of row_properties or column_properties must be specified.

UpdateBOrdersRequest

data UpdateBOrdersRequest Source #

Updates the borders of a range. If a field is not set in the request, that means the border remains as-is. For example, with two subsequent UpdateBordersRequest: 1. range: A1:A5 `{ top: RED, bottom: WHITE }` 2. range: A1:A5 `{ left: BLUE }` That would result in A1:A5 having a borders of `{ top: RED, bottom: WHITE, left: BLUE }`. If you want to clear a border, explicitly set the style to NONE.

See: updateBOrdersRequest smart constructor.

Instances
Eq UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateBOrdersRequest -> c UpdateBOrdersRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateBOrdersRequest #

toConstr :: UpdateBOrdersRequest -> Constr #

dataTypeOf :: UpdateBOrdersRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateBOrdersRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateBOrdersRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateBOrdersRequest -> UpdateBOrdersRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateBOrdersRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateBOrdersRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateBOrdersRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateBOrdersRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateBOrdersRequest -> m UpdateBOrdersRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateBOrdersRequest -> m UpdateBOrdersRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateBOrdersRequest -> m UpdateBOrdersRequest #

Show UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateBOrdersRequest :: Type -> Type #

ToJSON UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateBOrdersRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateBOrdersRequest = D1 (MetaData "UpdateBOrdersRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateBOrdersRequest'" PrefixI True) ((S1 (MetaSel (Just "_uborBottom") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: (S1 (MetaSel (Just "_uborInnerHorizontal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: S1 (MetaSel (Just "_uborLeft") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)))) :*: ((S1 (MetaSel (Just "_uborInnerVertical") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: S1 (MetaSel (Just "_uborRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))) :*: (S1 (MetaSel (Just "_uborRight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder)) :*: S1 (MetaSel (Just "_uborTop") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrder))))))

updateBOrdersRequest :: UpdateBOrdersRequest Source #

Creates a value of UpdateBOrdersRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uborBottom :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The border to put at the bottom of the range.

uborInnerHorizontal :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The horizontal border to put within the range.

uborLeft :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The border to put at the left of the range.

uborInnerVertical :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The vertical border to put within the range.

uborRange :: Lens' UpdateBOrdersRequest (Maybe GridRange) Source #

The range whose borders should be updated.

uborRight :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The border to put at the right of the range.

uborTop :: Lens' UpdateBOrdersRequest (Maybe BOrder) Source #

The border to put at the top of the range.

ValueRangeMajorDimension

data ValueRangeMajorDimension Source #

The major dimension of the values. For output, if the spreadsheet data is: `A1=1,B1=2,A2=3,B2=4`, then requesting `range=A1:B2,majorDimension=ROWS` will return `[[1,2],[3,4]]`, whereas requesting `range=A1:B2,majorDimension=COLUMNS` will return `[[1,3],[2,4]]`. For input, with `range=A1:B2,majorDimension=ROWS` then `[[1,2],[3,4]]` will set `A1=1,B1=2,A2=3,B2=4`. With `range=A1:B2,majorDimension=COLUMNS` then `[[1,2],[3,4]]` will set `A1=1,B1=3,A2=2,B2=4`. When writing, if this field is not set, it defaults to ROWS.

Constructors

VRMDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

VRMDRows

ROWS Operates on the rows of a sheet.

VRMDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ValueRangeMajorDimension -> c ValueRangeMajorDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ValueRangeMajorDimension #

toConstr :: ValueRangeMajorDimension -> Constr #

dataTypeOf :: ValueRangeMajorDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ValueRangeMajorDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ValueRangeMajorDimension) #

gmapT :: (forall b. Data b => b -> b) -> ValueRangeMajorDimension -> ValueRangeMajorDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ValueRangeMajorDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ValueRangeMajorDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> ValueRangeMajorDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ValueRangeMajorDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ValueRangeMajorDimension -> m ValueRangeMajorDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ValueRangeMajorDimension -> m ValueRangeMajorDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ValueRangeMajorDimension -> m ValueRangeMajorDimension #

Ord ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep ValueRangeMajorDimension :: Type -> Type #

Hashable ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ValueRangeMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ValueRangeMajorDimension = D1 (MetaData "ValueRangeMajorDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "VRMDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "VRMDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "VRMDColumns" PrefixI False) (U1 :: Type -> Type)))

BatchUpdateValuesByDataFilterRequest

data BatchUpdateValuesByDataFilterRequest Source #

The request for updating more than one range of values in a spreadsheet.

See: batchUpdateValuesByDataFilterRequest smart constructor.

Instances
Eq BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateValuesByDataFilterRequest -> c BatchUpdateValuesByDataFilterRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateValuesByDataFilterRequest #

toConstr :: BatchUpdateValuesByDataFilterRequest -> Constr #

dataTypeOf :: BatchUpdateValuesByDataFilterRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateValuesByDataFilterRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateValuesByDataFilterRequest) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateValuesByDataFilterRequest -> BatchUpdateValuesByDataFilterRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateValuesByDataFilterRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateValuesByDataFilterRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequest -> m BatchUpdateValuesByDataFilterRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequest -> m BatchUpdateValuesByDataFilterRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateValuesByDataFilterRequest -> m BatchUpdateValuesByDataFilterRequest #

Show BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateValuesByDataFilterRequest = D1 (MetaData "BatchUpdateValuesByDataFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateValuesByDataFilterRequest'" PrefixI True) ((S1 (MetaSel (Just "_buvbdfrData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilterValueRange])) :*: S1 (MetaSel (Just "_buvbdfrValueInputOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesByDataFilterRequestValueInputOption))) :*: (S1 (MetaSel (Just "_buvbdfrIncludeValuesInResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_buvbdfrResponseDateTimeRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption)) :*: S1 (MetaSel (Just "_buvbdfrResponseValueRenderOption") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BatchUpdateValuesByDataFilterRequestResponseValueRenderOption))))))

buvbdfrData :: Lens' BatchUpdateValuesByDataFilterRequest [DataFilterValueRange] Source #

The new values to apply to the spreadsheet. If more than one range is matched by the specified DataFilter the specified values will be applied to all of those ranges.

buvbdfrIncludeValuesInResponse :: Lens' BatchUpdateValuesByDataFilterRequest (Maybe Bool) Source #

Determines if the update response should include the values of the cells that were updated. By default, responses do not include the updated values. The `updatedData` field within each of the BatchUpdateValuesResponse.responses will contain the updated values. If the range to write was larger than than the range actually written, the response will include all values in the requested range (excluding trailing empty rows and columns).

buvbdfrResponseDateTimeRenderOption :: Lens' BatchUpdateValuesByDataFilterRequest (Maybe BatchUpdateValuesByDataFilterRequestResponseDateTimeRenderOption) Source #

Determines how dates, times, and durations in the response should be rendered. This is ignored if response_value_render_option is FORMATTED_VALUE. The default dateTime render option is DateTimeRenderOption.SERIAL_NUMBER.

buvbdfrResponseValueRenderOption :: Lens' BatchUpdateValuesByDataFilterRequest (Maybe BatchUpdateValuesByDataFilterRequestResponseValueRenderOption) Source #

Determines how values in the response should be rendered. The default render option is ValueRenderOption.FORMATTED_VALUE.

PivotGroupSortOrder

data PivotGroupSortOrder Source #

The order the values in this group should be sorted.

Constructors

PGSOSortOrderUnspecified

SORT_ORDER_UNSPECIFIED Default value, do not use this.

PGSOAscending

ASCENDING Sort ascending.

PGSODescending

DESCENDING Sort descending.

Instances
Enum PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotGroupSortOrder -> c PivotGroupSortOrder #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotGroupSortOrder #

toConstr :: PivotGroupSortOrder -> Constr #

dataTypeOf :: PivotGroupSortOrder -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotGroupSortOrder) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotGroupSortOrder) #

gmapT :: (forall b. Data b => b -> b) -> PivotGroupSortOrder -> PivotGroupSortOrder #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupSortOrder -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupSortOrder -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotGroupSortOrder -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotGroupSortOrder -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotGroupSortOrder -> m PivotGroupSortOrder #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupSortOrder -> m PivotGroupSortOrder #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupSortOrder -> m PivotGroupSortOrder #

Ord PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PivotGroupSortOrder :: Type -> Type #

Hashable PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotGroupSortOrder Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotGroupSortOrder = D1 (MetaData "PivotGroupSortOrder" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PGSOSortOrderUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PGSOAscending" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PGSODescending" PrefixI False) (U1 :: Type -> Type)))

BasicChartSpecChartType

data BasicChartSpecChartType Source #

The type of the chart.

Constructors

BasicChartTypeUnspecified

BASIC_CHART_TYPE_UNSPECIFIED Default value, do not use.

Bar

BAR A bar chart.

Line

LINE A line chart.

Area

AREA An area chart.

Column

COLUMN A column chart.

Scatter

SCATTER A scatter chart.

Combo

COMBO A combo chart.

SteppedArea

STEPPED_AREA A stepped area chart.

Instances
Enum BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSpecChartType -> c BasicChartSpecChartType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSpecChartType #

toConstr :: BasicChartSpecChartType -> Constr #

dataTypeOf :: BasicChartSpecChartType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSpecChartType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSpecChartType) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSpecChartType -> BasicChartSpecChartType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecChartType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecChartType -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSpecChartType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSpecChartType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSpecChartType -> m BasicChartSpecChartType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecChartType -> m BasicChartSpecChartType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecChartType -> m BasicChartSpecChartType #

Ord BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSpecChartType :: Type -> Type #

Hashable BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecChartType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecChartType = D1 (MetaData "BasicChartSpecChartType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "BasicChartTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Bar" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Line" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Area" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "Column" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Scatter" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Combo" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SteppedArea" PrefixI False) (U1 :: Type -> Type))))

EmbeddedChart

data EmbeddedChart Source #

A chart embedded in a sheet.

See: embeddedChart smart constructor.

Instances
Eq EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EmbeddedChart -> c EmbeddedChart #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EmbeddedChart #

toConstr :: EmbeddedChart -> Constr #

dataTypeOf :: EmbeddedChart -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EmbeddedChart) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EmbeddedChart) #

gmapT :: (forall b. Data b => b -> b) -> EmbeddedChart -> EmbeddedChart #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EmbeddedChart -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EmbeddedChart -> r #

gmapQ :: (forall d. Data d => d -> u) -> EmbeddedChart -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EmbeddedChart -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EmbeddedChart -> m EmbeddedChart #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EmbeddedChart -> m EmbeddedChart #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EmbeddedChart -> m EmbeddedChart #

Show EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep EmbeddedChart :: Type -> Type #

ToJSON EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep EmbeddedChart Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep EmbeddedChart = D1 (MetaData "EmbeddedChart" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "EmbeddedChart'" PrefixI True) (S1 (MetaSel (Just "_ecSpec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartSpec)) :*: (S1 (MetaSel (Just "_ecPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe EmbeddedObjectPosition)) :*: S1 (MetaSel (Just "_ecChartId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

embeddedChart :: EmbeddedChart Source #

Creates a value of EmbeddedChart with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ecSpec :: Lens' EmbeddedChart (Maybe ChartSpec) Source #

The specification of the chart.

ecChartId :: Lens' EmbeddedChart (Maybe Int32) Source #

The ID of the chart.

RowData

data RowData Source #

Data about each cell in a row.

See: rowData smart constructor.

Instances
Eq RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

(==) :: RowData -> RowData -> Bool #

(/=) :: RowData -> RowData -> Bool #

Data RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RowData -> c RowData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RowData #

toConstr :: RowData -> Constr #

dataTypeOf :: RowData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RowData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RowData) #

gmapT :: (forall b. Data b => b -> b) -> RowData -> RowData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RowData -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RowData -> r #

gmapQ :: (forall d. Data d => d -> u) -> RowData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RowData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RowData -> m RowData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RowData -> m RowData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RowData -> m RowData #

Show RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep RowData :: Type -> Type #

Methods

from :: RowData -> Rep RowData x #

to :: Rep RowData x -> RowData #

ToJSON RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RowData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RowData = D1 (MetaData "RowData" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "RowData'" PrefixI True) (S1 (MetaSel (Just "_rdValues") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [CellData]))))

rowData :: RowData Source #

Creates a value of RowData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

rdValues :: Lens' RowData [CellData] Source #

The values in the row, one per column.

Editors

data Editors Source #

The editors of a protected range.

See: editors smart constructor.

Instances
Eq Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

(==) :: Editors -> Editors -> Bool #

(/=) :: Editors -> Editors -> Bool #

Data Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Editors -> c Editors #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Editors #

toConstr :: Editors -> Constr #

dataTypeOf :: Editors -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Editors) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Editors) #

gmapT :: (forall b. Data b => b -> b) -> Editors -> Editors #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Editors -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Editors -> r #

gmapQ :: (forall d. Data d => d -> u) -> Editors -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Editors -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Editors -> m Editors #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Editors -> m Editors #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Editors -> m Editors #

Show Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Editors :: Type -> Type #

Methods

from :: Editors -> Rep Editors x #

to :: Rep Editors x -> Editors #

ToJSON Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Editors Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Editors = D1 (MetaData "Editors" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Editors'" PrefixI True) (S1 (MetaSel (Just "_eGroups") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: (S1 (MetaSel (Just "_eUsers") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_eDomainUsersCanEdit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

editors :: Editors Source #

Creates a value of Editors with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eGroups :: Lens' Editors [Text] Source #

The email addresses of groups with edit access to the protected range.

eUsers :: Lens' Editors [Text] Source #

The email addresses of users with edit access to the protected range.

eDomainUsersCanEdit :: Lens' Editors (Maybe Bool) Source #

True if anyone in the document's domain has edit access to the protected range. Domain protection is only supported on documents within a domain.

Xgafv

data Xgafv Source #

V1 error format.

Constructors

X1

1 v1 error format

X2

2 v2 error format

Instances
Enum Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

(==) :: Xgafv -> Xgafv -> Bool #

(/=) :: Xgafv -> Xgafv -> Bool #

Data Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Xgafv -> c Xgafv #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Xgafv #

toConstr :: Xgafv -> Constr #

dataTypeOf :: Xgafv -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Xgafv) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Xgafv) #

gmapT :: (forall b. Data b => b -> b) -> Xgafv -> Xgafv #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Xgafv -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Xgafv -> r #

gmapQ :: (forall d. Data d => d -> u) -> Xgafv -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Xgafv -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Xgafv -> m Xgafv #

Ord Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

compare :: Xgafv -> Xgafv -> Ordering #

(<) :: Xgafv -> Xgafv -> Bool #

(<=) :: Xgafv -> Xgafv -> Bool #

(>) :: Xgafv -> Xgafv -> Bool #

(>=) :: Xgafv -> Xgafv -> Bool #

max :: Xgafv -> Xgafv -> Xgafv #

min :: Xgafv -> Xgafv -> Xgafv #

Read Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

showsPrec :: Int -> Xgafv -> ShowS #

show :: Xgafv -> String #

showList :: [Xgafv] -> ShowS #

Generic Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep Xgafv :: Type -> Type #

Methods

from :: Xgafv -> Rep Xgafv x #

to :: Rep Xgafv x -> Xgafv #

Hashable Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

hashWithSalt :: Int -> Xgafv -> Int #

hash :: Xgafv -> Int #

ToJSON Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep Xgafv Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep Xgafv = D1 (MetaData "Xgafv" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "X1" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "X2" PrefixI False) (U1 :: Type -> Type))

PivotTable

data PivotTable Source #

A pivot table.

See: pivotTable smart constructor.

Instances
Eq PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotTable -> c PivotTable #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotTable #

toConstr :: PivotTable -> Constr #

dataTypeOf :: PivotTable -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotTable) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotTable) #

gmapT :: (forall b. Data b => b -> b) -> PivotTable -> PivotTable #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotTable -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotTable -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotTable -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotTable -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotTable -> m PivotTable #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTable -> m PivotTable #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTable -> m PivotTable #

Show PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotTable :: Type -> Type #

ToJSON PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotTable Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

pivotTable :: PivotTable Source #

Creates a value of PivotTable with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ptValues :: Lens' PivotTable [PivotValue] Source #

A list of values to include in the pivot table.

ptValueLayout :: Lens' PivotTable (Maybe PivotTableValueLayout) Source #

Whether values should be listed horizontally (as columns) or vertically (as rows).

ptRows :: Lens' PivotTable [PivotGroup] Source #

Each row grouping in the pivot table.

ptSource :: Lens' PivotTable (Maybe GridRange) Source #

The range the pivot table is reading data from.

ptColumns :: Lens' PivotTable [PivotGroup] Source #

Each column grouping in the pivot table.

ptCriteria :: Lens' PivotTable (Maybe PivotTableCriteria) Source #

An optional mapping of filters per source column offset. The filters are applied before aggregating data into the pivot table. The map's key is the column offset of the source range that you want to filter, and the value is the criteria for that column. For example, if the source was `C10:E15`, a key of `0` will have the filter for column `C`, whereas the key `1` is for column `D`.

EmbeddedObjectPosition

data EmbeddedObjectPosition Source #

The position of an embedded object such as a chart.

See: embeddedObjectPosition smart constructor.

Instances
Eq EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> EmbeddedObjectPosition -> c EmbeddedObjectPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c EmbeddedObjectPosition #

toConstr :: EmbeddedObjectPosition -> Constr #

dataTypeOf :: EmbeddedObjectPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c EmbeddedObjectPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c EmbeddedObjectPosition) #

gmapT :: (forall b. Data b => b -> b) -> EmbeddedObjectPosition -> EmbeddedObjectPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> EmbeddedObjectPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> EmbeddedObjectPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> EmbeddedObjectPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> EmbeddedObjectPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> EmbeddedObjectPosition -> m EmbeddedObjectPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> EmbeddedObjectPosition -> m EmbeddedObjectPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> EmbeddedObjectPosition -> m EmbeddedObjectPosition #

Show EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep EmbeddedObjectPosition :: Type -> Type #

ToJSON EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep EmbeddedObjectPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep EmbeddedObjectPosition = D1 (MetaData "EmbeddedObjectPosition" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "EmbeddedObjectPosition'" PrefixI True) (S1 (MetaSel (Just "_eopOverlayPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OverlayPosition)) :*: (S1 (MetaSel (Just "_eopSheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_eopNewSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

embeddedObjectPosition :: EmbeddedObjectPosition Source #

Creates a value of EmbeddedObjectPosition with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

eopOverlayPosition :: Lens' EmbeddedObjectPosition (Maybe OverlayPosition) Source #

The position at which the object is overlaid on top of a grid.

eopSheetId :: Lens' EmbeddedObjectPosition (Maybe Int32) Source #

The sheet this is on. Set only if the embedded object is on its own sheet. Must be non-negative.

eopNewSheet :: Lens' EmbeddedObjectPosition (Maybe Bool) Source #

If true, the embedded object is put on a new sheet whose ID is chosen for you. Used only when writing.

BasicFilter

data BasicFilter Source #

The default filter associated with a sheet.

See: basicFilter smart constructor.

Instances
Eq BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicFilter -> c BasicFilter #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicFilter #

toConstr :: BasicFilter -> Constr #

dataTypeOf :: BasicFilter -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicFilter) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicFilter) #

gmapT :: (forall b. Data b => b -> b) -> BasicFilter -> BasicFilter #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicFilter -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicFilter -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicFilter -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicFilter -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicFilter -> m BasicFilter #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFilter -> m BasicFilter #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicFilter -> m BasicFilter #

Show BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicFilter :: Type -> Type #

ToJSON BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicFilter = D1 (MetaData "BasicFilter" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BasicFilter'" PrefixI True) (S1 (MetaSel (Just "_bfSortSpecs") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [SortSpec])) :*: (S1 (MetaSel (Just "_bfRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_bfCriteria") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicFilterCriteria)))))

basicFilter :: BasicFilter Source #

Creates a value of BasicFilter with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bfSortSpecs :: Lens' BasicFilter [SortSpec] Source #

The sort order per column. Later specifications are used when values are equal in the earlier specifications.

bfRange :: Lens' BasicFilter (Maybe GridRange) Source #

The range the filter covers.

bfCriteria :: Lens' BasicFilter (Maybe BasicFilterCriteria) Source #

The criteria for showing/hiding values per column. The map's key is the column index, and the value is the criteria for that column.

TextToColumnsRequest

data TextToColumnsRequest Source #

Splits a column of text into multiple columns, based on a delimiter in each cell.

See: textToColumnsRequest smart constructor.

Instances
Eq TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TextToColumnsRequest -> c TextToColumnsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TextToColumnsRequest #

toConstr :: TextToColumnsRequest -> Constr #

dataTypeOf :: TextToColumnsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TextToColumnsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TextToColumnsRequest) #

gmapT :: (forall b. Data b => b -> b) -> TextToColumnsRequest -> TextToColumnsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TextToColumnsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TextToColumnsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> TextToColumnsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TextToColumnsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TextToColumnsRequest -> m TextToColumnsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TextToColumnsRequest -> m TextToColumnsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TextToColumnsRequest -> m TextToColumnsRequest #

Show TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TextToColumnsRequest :: Type -> Type #

ToJSON TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextToColumnsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextToColumnsRequest = D1 (MetaData "TextToColumnsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TextToColumnsRequest'" PrefixI True) (S1 (MetaSel (Just "_ttcrDelimiterType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextToColumnsRequestDelimiterType)) :*: (S1 (MetaSel (Just "_ttcrSource") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_ttcrDelimiter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))

textToColumnsRequest :: TextToColumnsRequest Source #

Creates a value of TextToColumnsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ttcrSource :: Lens' TextToColumnsRequest (Maybe GridRange) Source #

The source data range. This must span exactly one column.

ttcrDelimiter :: Lens' TextToColumnsRequest (Maybe Text) Source #

The delimiter to use. Used only if delimiterType is CUSTOM.

SpreadsheetPropertiesAutoRecalc

data SpreadsheetPropertiesAutoRecalc Source #

The amount of time to wait before volatile functions are recalculated.

Constructors

SPARRecalculationIntervalUnspecified

RECALCULATION_INTERVAL_UNSPECIFIED Default value. This value must not be used.

SPAROnChange

ON_CHANGE Volatile functions are updated on every change.

SPARMinute

MINUTE Volatile functions are updated on every change and every minute.

SPARHour

HOUR Volatile functions are updated on every change and hourly.

Instances
Enum SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SpreadsheetPropertiesAutoRecalc -> c SpreadsheetPropertiesAutoRecalc #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SpreadsheetPropertiesAutoRecalc #

toConstr :: SpreadsheetPropertiesAutoRecalc -> Constr #

dataTypeOf :: SpreadsheetPropertiesAutoRecalc -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SpreadsheetPropertiesAutoRecalc) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SpreadsheetPropertiesAutoRecalc) #

gmapT :: (forall b. Data b => b -> b) -> SpreadsheetPropertiesAutoRecalc -> SpreadsheetPropertiesAutoRecalc #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SpreadsheetPropertiesAutoRecalc -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SpreadsheetPropertiesAutoRecalc -> r #

gmapQ :: (forall d. Data d => d -> u) -> SpreadsheetPropertiesAutoRecalc -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SpreadsheetPropertiesAutoRecalc -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SpreadsheetPropertiesAutoRecalc -> m SpreadsheetPropertiesAutoRecalc #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SpreadsheetPropertiesAutoRecalc -> m SpreadsheetPropertiesAutoRecalc #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SpreadsheetPropertiesAutoRecalc -> m SpreadsheetPropertiesAutoRecalc #

Ord SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep SpreadsheetPropertiesAutoRecalc :: Type -> Type #

Hashable SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SpreadsheetPropertiesAutoRecalc Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep SpreadsheetPropertiesAutoRecalc = D1 (MetaData "SpreadsheetPropertiesAutoRecalc" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "SPARRecalculationIntervalUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SPAROnChange" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SPARMinute" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SPARHour" PrefixI False) (U1 :: Type -> Type)))

CopyPasteRequestPasteOrientation

data CopyPasteRequestPasteOrientation Source #

How that data should be oriented when pasting.

Constructors

Normal

NORMAL Paste normally.

Transpose

TRANSPOSE Paste transposed, where all rows become columns and vice versa.

Instances
Enum CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CopyPasteRequestPasteOrientation -> c CopyPasteRequestPasteOrientation #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CopyPasteRequestPasteOrientation #

toConstr :: CopyPasteRequestPasteOrientation -> Constr #

dataTypeOf :: CopyPasteRequestPasteOrientation -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CopyPasteRequestPasteOrientation) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CopyPasteRequestPasteOrientation) #

gmapT :: (forall b. Data b => b -> b) -> CopyPasteRequestPasteOrientation -> CopyPasteRequestPasteOrientation #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CopyPasteRequestPasteOrientation -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CopyPasteRequestPasteOrientation -> r #

gmapQ :: (forall d. Data d => d -> u) -> CopyPasteRequestPasteOrientation -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CopyPasteRequestPasteOrientation -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CopyPasteRequestPasteOrientation -> m CopyPasteRequestPasteOrientation #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CopyPasteRequestPasteOrientation -> m CopyPasteRequestPasteOrientation #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CopyPasteRequestPasteOrientation -> m CopyPasteRequestPasteOrientation #

Ord CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CopyPasteRequestPasteOrientation :: Type -> Type #

Hashable CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CopyPasteRequestPasteOrientation Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CopyPasteRequestPasteOrientation = D1 (MetaData "CopyPasteRequestPasteOrientation" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Normal" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Transpose" PrefixI False) (U1 :: Type -> Type))

GetSpreadsheetByDataFilterRequest

data GetSpreadsheetByDataFilterRequest Source #

The request for retrieving a Spreadsheet.

See: getSpreadsheetByDataFilterRequest smart constructor.

Instances
Eq GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GetSpreadsheetByDataFilterRequest -> c GetSpreadsheetByDataFilterRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GetSpreadsheetByDataFilterRequest #

toConstr :: GetSpreadsheetByDataFilterRequest -> Constr #

dataTypeOf :: GetSpreadsheetByDataFilterRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GetSpreadsheetByDataFilterRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GetSpreadsheetByDataFilterRequest) #

gmapT :: (forall b. Data b => b -> b) -> GetSpreadsheetByDataFilterRequest -> GetSpreadsheetByDataFilterRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GetSpreadsheetByDataFilterRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GetSpreadsheetByDataFilterRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> GetSpreadsheetByDataFilterRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GetSpreadsheetByDataFilterRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GetSpreadsheetByDataFilterRequest -> m GetSpreadsheetByDataFilterRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GetSpreadsheetByDataFilterRequest -> m GetSpreadsheetByDataFilterRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GetSpreadsheetByDataFilterRequest -> m GetSpreadsheetByDataFilterRequest #

Show GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GetSpreadsheetByDataFilterRequest :: Type -> Type #

ToJSON GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GetSpreadsheetByDataFilterRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GetSpreadsheetByDataFilterRequest = D1 (MetaData "GetSpreadsheetByDataFilterRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GetSpreadsheetByDataFilterRequest'" PrefixI True) (S1 (MetaSel (Just "_gsbdfrDataFilters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilter])) :*: S1 (MetaSel (Just "_gsbdfrIncludeGridData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

getSpreadsheetByDataFilterRequest :: GetSpreadsheetByDataFilterRequest Source #

Creates a value of GetSpreadsheetByDataFilterRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gsbdfrDataFilters :: Lens' GetSpreadsheetByDataFilterRequest [DataFilter] Source #

The DataFilters used to select which ranges to retrieve from the spreadsheet.

gsbdfrIncludeGridData :: Lens' GetSpreadsheetByDataFilterRequest (Maybe Bool) Source #

True if grid data should be returned. This parameter is ignored if a field mask was set in the request.

BatchUpdateSpreadsheetRequest

data BatchUpdateSpreadsheetRequest Source #

The request for updating any aspect of a spreadsheet.

See: batchUpdateSpreadsheetRequest smart constructor.

Instances
Eq BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateSpreadsheetRequest -> c BatchUpdateSpreadsheetRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateSpreadsheetRequest #

toConstr :: BatchUpdateSpreadsheetRequest -> Constr #

dataTypeOf :: BatchUpdateSpreadsheetRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateSpreadsheetRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateSpreadsheetRequest) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateSpreadsheetRequest -> BatchUpdateSpreadsheetRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateSpreadsheetRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateSpreadsheetRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateSpreadsheetRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateSpreadsheetRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetRequest -> m BatchUpdateSpreadsheetRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetRequest -> m BatchUpdateSpreadsheetRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetRequest -> m BatchUpdateSpreadsheetRequest #

Show BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchUpdateSpreadsheetRequest :: Type -> Type #

ToJSON BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateSpreadsheetRequest = D1 (MetaData "BatchUpdateSpreadsheetRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateSpreadsheetRequest'" PrefixI True) ((S1 (MetaSel (Just "_busrResponseIncludeGridData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_busrResponseRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text]))) :*: (S1 (MetaSel (Just "_busrRequests") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Request'])) :*: S1 (MetaSel (Just "_busrIncludeSpreadsheetInResponse") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)))))

batchUpdateSpreadsheetRequest :: BatchUpdateSpreadsheetRequest Source #

Creates a value of BatchUpdateSpreadsheetRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

busrResponseIncludeGridData :: Lens' BatchUpdateSpreadsheetRequest (Maybe Bool) Source #

True if grid data should be returned. Meaningful only if if include_spreadsheet_in_response is 'true'. This parameter is ignored if a field mask was set in the request.

busrResponseRanges :: Lens' BatchUpdateSpreadsheetRequest [Text] Source #

Limits the ranges included in the response spreadsheet. Meaningful only if include_spreadsheet_response is 'true'.

busrRequests :: Lens' BatchUpdateSpreadsheetRequest [Request'] Source #

A list of updates to apply to the spreadsheet. Requests will be applied in the order they are specified. If any request is not valid, no requests will be applied.

busrIncludeSpreadsheetInResponse :: Lens' BatchUpdateSpreadsheetRequest (Maybe Bool) Source #

Determines if the update response should include the spreadsheet resource.

PasteDataRequestType

data PasteDataRequestType Source #

How the data should be pasted.

Constructors

PDRTPasteNormal

PASTE_NORMAL Paste values, formulas, formats, and merges.

PDRTPasteValues

PASTE_VALUES Paste the values ONLY without formats, formulas, or merges.

PDRTPasteFormat

PASTE_FORMAT Paste the format and data validation only.

PDRTPasteNoBOrders

PASTE_NO_BORDERS Like PASTE_NORMAL but without borders.

PDRTPasteFormula

PASTE_FORMULA Paste the formulas only.

PDRTPasteDataValidation

PASTE_DATA_VALIDATION Paste the data validation only.

PDRTPasteConditionalFormatting

PASTE_CONDITIONAL_FORMATTING Paste the conditional formatting rules only.

Instances
Enum PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PasteDataRequestType -> c PasteDataRequestType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PasteDataRequestType #

toConstr :: PasteDataRequestType -> Constr #

dataTypeOf :: PasteDataRequestType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PasteDataRequestType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PasteDataRequestType) #

gmapT :: (forall b. Data b => b -> b) -> PasteDataRequestType -> PasteDataRequestType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PasteDataRequestType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PasteDataRequestType -> r #

gmapQ :: (forall d. Data d => d -> u) -> PasteDataRequestType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PasteDataRequestType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PasteDataRequestType -> m PasteDataRequestType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PasteDataRequestType -> m PasteDataRequestType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PasteDataRequestType -> m PasteDataRequestType #

Ord PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PasteDataRequestType :: Type -> Type #

Hashable PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PasteDataRequestType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PasteDataRequestType = D1 (MetaData "PasteDataRequestType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "PDRTPasteNormal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "PDRTPasteValues" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PDRTPasteFormat" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "PDRTPasteNoBOrders" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PDRTPasteFormula" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PDRTPasteDataValidation" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PDRTPasteConditionalFormatting" PrefixI False) (U1 :: Type -> Type))))

UpdateValuesResponse

data UpdateValuesResponse Source #

The response when updating a range of values in a spreadsheet.

See: updateValuesResponse smart constructor.

Instances
Eq UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateValuesResponse -> c UpdateValuesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateValuesResponse #

toConstr :: UpdateValuesResponse -> Constr #

dataTypeOf :: UpdateValuesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateValuesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateValuesResponse) #

gmapT :: (forall b. Data b => b -> b) -> UpdateValuesResponse -> UpdateValuesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateValuesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateValuesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateValuesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateValuesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateValuesResponse -> m UpdateValuesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateValuesResponse -> m UpdateValuesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateValuesResponse -> m UpdateValuesResponse #

Show UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateValuesResponse :: Type -> Type #

ToJSON UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateValuesResponse = D1 (MetaData "UpdateValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateValuesResponse'" PrefixI True) ((S1 (MetaSel (Just "_uvrUpdatedCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_uvrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_uvrUpdatedRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))) :*: (S1 (MetaSel (Just "_uvrUpdatedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_uvrUpdatedData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ValueRange)) :*: S1 (MetaSel (Just "_uvrUpdatedColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

updateValuesResponse :: UpdateValuesResponse Source #

Creates a value of UpdateValuesResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uvrUpdatedCells :: Lens' UpdateValuesResponse (Maybe Int32) Source #

The number of cells updated.

uvrSpreadsheetId :: Lens' UpdateValuesResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

uvrUpdatedRows :: Lens' UpdateValuesResponse (Maybe Int32) Source #

The number of rows where at least one cell in the row was updated.

uvrUpdatedRange :: Lens' UpdateValuesResponse (Maybe Text) Source #

The range (in A1 notation) that updates were applied to.

uvrUpdatedData :: Lens' UpdateValuesResponse (Maybe ValueRange) Source #

The values of the cells after updates were applied. This is only included if the request's `includeValuesInResponse` field was `true`.

uvrUpdatedColumns :: Lens' UpdateValuesResponse (Maybe Int32) Source #

The number of columns where at least one cell in the column was updated.

DeleteDimensionGroupResponse

data DeleteDimensionGroupResponse Source #

The result of deleting a group.

See: deleteDimensionGroupResponse smart constructor.

Instances
Eq DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteDimensionGroupResponse -> c DeleteDimensionGroupResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteDimensionGroupResponse #

toConstr :: DeleteDimensionGroupResponse -> Constr #

dataTypeOf :: DeleteDimensionGroupResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteDimensionGroupResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteDimensionGroupResponse) #

gmapT :: (forall b. Data b => b -> b) -> DeleteDimensionGroupResponse -> DeleteDimensionGroupResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDimensionGroupResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDimensionGroupResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteDimensionGroupResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteDimensionGroupResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteDimensionGroupResponse -> m DeleteDimensionGroupResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDimensionGroupResponse -> m DeleteDimensionGroupResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDimensionGroupResponse -> m DeleteDimensionGroupResponse #

Show DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteDimensionGroupResponse :: Type -> Type #

ToJSON DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionGroupResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDimensionGroupResponse = D1 (MetaData "DeleteDimensionGroupResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteDimensionGroupResponse'" PrefixI True) (S1 (MetaSel (Just "_ddgrDimensionGroups") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DimensionGroup]))))

deleteDimensionGroupResponse :: DeleteDimensionGroupResponse Source #

Creates a value of DeleteDimensionGroupResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ddgrDimensionGroups :: Lens' DeleteDimensionGroupResponse [DimensionGroup] Source #

All groups of a dimension after deleting a group from that dimension.

CopySheetToAnotherSpreadsheetRequest

data CopySheetToAnotherSpreadsheetRequest Source #

The request to copy a sheet across spreadsheets.

See: copySheetToAnotherSpreadsheetRequest smart constructor.

Instances
Eq CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CopySheetToAnotherSpreadsheetRequest -> c CopySheetToAnotherSpreadsheetRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CopySheetToAnotherSpreadsheetRequest #

toConstr :: CopySheetToAnotherSpreadsheetRequest -> Constr #

dataTypeOf :: CopySheetToAnotherSpreadsheetRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CopySheetToAnotherSpreadsheetRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CopySheetToAnotherSpreadsheetRequest) #

gmapT :: (forall b. Data b => b -> b) -> CopySheetToAnotherSpreadsheetRequest -> CopySheetToAnotherSpreadsheetRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CopySheetToAnotherSpreadsheetRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CopySheetToAnotherSpreadsheetRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> CopySheetToAnotherSpreadsheetRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CopySheetToAnotherSpreadsheetRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CopySheetToAnotherSpreadsheetRequest -> m CopySheetToAnotherSpreadsheetRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CopySheetToAnotherSpreadsheetRequest -> m CopySheetToAnotherSpreadsheetRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CopySheetToAnotherSpreadsheetRequest -> m CopySheetToAnotherSpreadsheetRequest #

Show CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CopySheetToAnotherSpreadsheetRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CopySheetToAnotherSpreadsheetRequest = D1 (MetaData "CopySheetToAnotherSpreadsheetRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "CopySheetToAnotherSpreadsheetRequest'" PrefixI True) (S1 (MetaSel (Just "_cstasrDestinationSpreadsheetId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe Text))))

copySheetToAnotherSpreadsheetRequest :: CopySheetToAnotherSpreadsheetRequest Source #

Creates a value of CopySheetToAnotherSpreadsheetRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cstasrDestinationSpreadsheetId :: Lens' CopySheetToAnotherSpreadsheetRequest (Maybe Text) Source #

The ID of the spreadsheet to copy the sheet to.

AddFilterViewRequest

data AddFilterViewRequest Source #

Adds a filter view.

See: addFilterViewRequest smart constructor.

Instances
Eq AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddFilterViewRequest -> c AddFilterViewRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddFilterViewRequest #

toConstr :: AddFilterViewRequest -> Constr #

dataTypeOf :: AddFilterViewRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddFilterViewRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddFilterViewRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddFilterViewRequest -> AddFilterViewRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddFilterViewRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddFilterViewRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddFilterViewRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddFilterViewRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddFilterViewRequest -> m AddFilterViewRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddFilterViewRequest -> m AddFilterViewRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddFilterViewRequest -> m AddFilterViewRequest #

Show AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddFilterViewRequest :: Type -> Type #

ToJSON AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddFilterViewRequest = D1 (MetaData "AddFilterViewRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddFilterViewRequest'" PrefixI True) (S1 (MetaSel (Just "_aFilter") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe FilterView))))

addFilterViewRequest :: AddFilterViewRequest Source #

Creates a value of AddFilterViewRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aFilter :: Lens' AddFilterViewRequest (Maybe FilterView) Source #

The filter to add. The filterViewId field is optional; if one is not set, an id will be randomly generated. (It is an error to specify the ID of a filter that already exists.)

PivotGroupValueMetadata

data PivotGroupValueMetadata Source #

Metadata about a value in a pivot grouping.

See: pivotGroupValueMetadata smart constructor.

Instances
Eq PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotGroupValueMetadata -> c PivotGroupValueMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotGroupValueMetadata #

toConstr :: PivotGroupValueMetadata -> Constr #

dataTypeOf :: PivotGroupValueMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotGroupValueMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotGroupValueMetadata) #

gmapT :: (forall b. Data b => b -> b) -> PivotGroupValueMetadata -> PivotGroupValueMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupValueMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroupValueMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotGroupValueMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotGroupValueMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotGroupValueMetadata -> m PivotGroupValueMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupValueMetadata -> m PivotGroupValueMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroupValueMetadata -> m PivotGroupValueMetadata #

Show PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotGroupValueMetadata :: Type -> Type #

ToJSON PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupValueMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroupValueMetadata = D1 (MetaData "PivotGroupValueMetadata" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "PivotGroupValueMetadata'" PrefixI True) (S1 (MetaSel (Just "_pgvmValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ExtendedValue)) :*: S1 (MetaSel (Just "_pgvmCollapsed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))

pivotGroupValueMetadata :: PivotGroupValueMetadata Source #

Creates a value of PivotGroupValueMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pgvmValue :: Lens' PivotGroupValueMetadata (Maybe ExtendedValue) Source #

The calculated value the metadata corresponds to. (Note that formulaValue is not valid, because the values will be calculated.)

pgvmCollapsed :: Lens' PivotGroupValueMetadata (Maybe Bool) Source #

True if the data corresponding to the value is collapsed.

CellFormatTextDirection

data CellFormatTextDirection Source #

The direction of the text in the cell.

Constructors

TextDirectionUnspecified

TEXT_DIRECTION_UNSPECIFIED The text direction is not specified. Do not use this.

LeftToRight

LEFT_TO_RIGHT The text direction of left-to-right was set by the user.

RightToLeft

RIGHT_TO_LEFT The text direction of right-to-left was set by the user.

Instances
Enum CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellFormatTextDirection -> c CellFormatTextDirection #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellFormatTextDirection #

toConstr :: CellFormatTextDirection -> Constr #

dataTypeOf :: CellFormatTextDirection -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellFormatTextDirection) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellFormatTextDirection) #

gmapT :: (forall b. Data b => b -> b) -> CellFormatTextDirection -> CellFormatTextDirection #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatTextDirection -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellFormatTextDirection -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellFormatTextDirection -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellFormatTextDirection -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellFormatTextDirection -> m CellFormatTextDirection #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatTextDirection -> m CellFormatTextDirection #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormatTextDirection -> m CellFormatTextDirection #

Ord CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CellFormatTextDirection :: Type -> Type #

Hashable CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatTextDirection Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CellFormatTextDirection = D1 (MetaData "CellFormatTextDirection" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TextDirectionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "LeftToRight" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "RightToLeft" PrefixI False) (U1 :: Type -> Type)))

BatchClearValuesByDataFilterResponse

data BatchClearValuesByDataFilterResponse Source #

The response when clearing a range of values selected with DataFilters in a spreadsheet.

See: batchClearValuesByDataFilterResponse smart constructor.

Instances
Eq BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchClearValuesByDataFilterResponse -> c BatchClearValuesByDataFilterResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchClearValuesByDataFilterResponse #

toConstr :: BatchClearValuesByDataFilterResponse -> Constr #

dataTypeOf :: BatchClearValuesByDataFilterResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchClearValuesByDataFilterResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchClearValuesByDataFilterResponse) #

gmapT :: (forall b. Data b => b -> b) -> BatchClearValuesByDataFilterResponse -> BatchClearValuesByDataFilterResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchClearValuesByDataFilterResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchClearValuesByDataFilterResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchClearValuesByDataFilterResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchClearValuesByDataFilterResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchClearValuesByDataFilterResponse -> m BatchClearValuesByDataFilterResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchClearValuesByDataFilterResponse -> m BatchClearValuesByDataFilterResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchClearValuesByDataFilterResponse -> m BatchClearValuesByDataFilterResponse #

Show BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesByDataFilterResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesByDataFilterResponse = D1 (MetaData "BatchClearValuesByDataFilterResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchClearValuesByDataFilterResponse'" PrefixI True) (S1 (MetaSel (Just "_bcvbdfrClearedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bcvbdfrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

batchClearValuesByDataFilterResponse :: BatchClearValuesByDataFilterResponse Source #

Creates a value of BatchClearValuesByDataFilterResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bcvbdfrClearedRanges :: Lens' BatchClearValuesByDataFilterResponse [Text] Source #

The ranges that were cleared, in A1 notation. (If the requests were for an unbounded range or a ranger larger than the bounds of the sheet, this will be the actual ranges that were cleared, bounded to the sheet's limits.)

bcvbdfrSpreadsheetId :: Lens' BatchClearValuesByDataFilterResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

WaterfallChartSeries

data WaterfallChartSeries Source #

A single series of data for a waterfall chart.

See: waterfallChartSeries smart constructor.

Instances
Eq WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> WaterfallChartSeries -> c WaterfallChartSeries #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c WaterfallChartSeries #

toConstr :: WaterfallChartSeries -> Constr #

dataTypeOf :: WaterfallChartSeries -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c WaterfallChartSeries) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c WaterfallChartSeries) #

gmapT :: (forall b. Data b => b -> b) -> WaterfallChartSeries -> WaterfallChartSeries #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSeries -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> WaterfallChartSeries -> r #

gmapQ :: (forall d. Data d => d -> u) -> WaterfallChartSeries -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> WaterfallChartSeries -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> WaterfallChartSeries -> m WaterfallChartSeries #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSeries -> m WaterfallChartSeries #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> WaterfallChartSeries -> m WaterfallChartSeries #

Show WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep WaterfallChartSeries :: Type -> Type #

ToJSON WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep WaterfallChartSeries = D1 (MetaData "WaterfallChartSeries" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "WaterfallChartSeries'" PrefixI True) ((S1 (MetaSel (Just "_wcsData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: (S1 (MetaSel (Just "_wcsCustomSubtotals") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [WaterfallChartCustomSubtotal])) :*: S1 (MetaSel (Just "_wcsNegativeColumnsStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartColumnStyle)))) :*: (S1 (MetaSel (Just "_wcsHideTrailingSubtotal") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_wcsSubtotalColumnsStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartColumnStyle)) :*: S1 (MetaSel (Just "_wcsPositiveColumnsStyle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartColumnStyle))))))

waterfallChartSeries :: WaterfallChartSeries Source #

Creates a value of WaterfallChartSeries with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

wcsData :: Lens' WaterfallChartSeries (Maybe ChartData) Source #

The data being visualized in this series.

wcsCustomSubtotals :: Lens' WaterfallChartSeries [WaterfallChartCustomSubtotal] Source #

Custom subtotal columns appearing in this series. The order in which subtotals are defined is not significant. Only one subtotal may be defined for each data point.

wcsNegativeColumnsStyle :: Lens' WaterfallChartSeries (Maybe WaterfallChartColumnStyle) Source #

Styles for all columns in this series with negative values.

wcsHideTrailingSubtotal :: Lens' WaterfallChartSeries (Maybe Bool) Source #

True to hide the subtotal column from the end of the series. By default, a subtotal column will appear at the end of each series. Setting this field to true will hide that subtotal column for this series.

wcsSubtotalColumnsStyle :: Lens' WaterfallChartSeries (Maybe WaterfallChartColumnStyle) Source #

Styles for all subtotal columns in this series.

wcsPositiveColumnsStyle :: Lens' WaterfallChartSeries (Maybe WaterfallChartColumnStyle) Source #

Styles for all columns in this series with positive values.

BasicChartSeriesType

data BasicChartSeriesType Source #

The type of this series. Valid only if the chartType is COMBO. Different types will change the way the series is visualized. Only LINE, AREA, and COLUMN are supported.

Constructors

BCSTBasicChartTypeUnspecified

BASIC_CHART_TYPE_UNSPECIFIED Default value, do not use.

BCSTBar

BAR A bar chart.

BCSTLine

LINE A line chart.

BCSTArea

AREA An area chart.

BCSTColumn

COLUMN A column chart.

BCSTScatter

SCATTER A scatter chart.

BCSTCombo

COMBO A combo chart.

BCSTSteppedArea

STEPPED_AREA A stepped area chart.

Instances
Enum BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSeriesType -> c BasicChartSeriesType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSeriesType #

toConstr :: BasicChartSeriesType -> Constr #

dataTypeOf :: BasicChartSeriesType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSeriesType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSeriesType) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSeriesType -> BasicChartSeriesType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSeriesType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSeriesType -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSeriesType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSeriesType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSeriesType -> m BasicChartSeriesType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSeriesType -> m BasicChartSeriesType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSeriesType -> m BasicChartSeriesType #

Ord BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSeriesType :: Type -> Type #

Hashable BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSeriesType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSeriesType = D1 (MetaData "BasicChartSeriesType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "BCSTBasicChartTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTBar" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BCSTLine" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTArea" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "BCSTColumn" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTScatter" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "BCSTCombo" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSTSteppedArea" PrefixI False) (U1 :: Type -> Type))))

UpdateCellsRequest

data UpdateCellsRequest Source #

Updates all cells in a range with new data.

See: updateCellsRequest smart constructor.

Instances
Eq UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateCellsRequest -> c UpdateCellsRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateCellsRequest #

toConstr :: UpdateCellsRequest -> Constr #

dataTypeOf :: UpdateCellsRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateCellsRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateCellsRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateCellsRequest -> UpdateCellsRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateCellsRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateCellsRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateCellsRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateCellsRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateCellsRequest -> m UpdateCellsRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateCellsRequest -> m UpdateCellsRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateCellsRequest -> m UpdateCellsRequest #

Show UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateCellsRequest :: Type -> Type #

ToJSON UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateCellsRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateCellsRequest = D1 (MetaData "UpdateCellsRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateCellsRequest'" PrefixI True) ((S1 (MetaSel (Just "_updStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridCoordinate)) :*: S1 (MetaSel (Just "_updRows") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [RowData]))) :*: (S1 (MetaSel (Just "_updRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: S1 (MetaSel (Just "_updFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask)))))

updateCellsRequest :: UpdateCellsRequest Source #

Creates a value of UpdateCellsRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

updStart :: Lens' UpdateCellsRequest (Maybe GridCoordinate) Source #

The coordinate to start writing data at. Any number of rows and columns (including a different number of columns per row) may be written.

updRange :: Lens' UpdateCellsRequest (Maybe GridRange) Source #

The range to write data to. If the data in rows does not cover the entire requested range, the fields matching those set in fields will be cleared.

updFields :: Lens' UpdateCellsRequest (Maybe GFieldMask) Source #

The fields of CellData that should be updated. At least one field must be specified. The root is the CellData; 'row.values.' should not be specified. A single `"*"` can be used as short-hand for listing every field.

CellFormat

data CellFormat Source #

The format of a cell.

See: cellFormat smart constructor.

Instances
Eq CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CellFormat -> c CellFormat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CellFormat #

toConstr :: CellFormat -> Constr #

dataTypeOf :: CellFormat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CellFormat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CellFormat) #

gmapT :: (forall b. Data b => b -> b) -> CellFormat -> CellFormat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CellFormat -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CellFormat -> r #

gmapQ :: (forall d. Data d => d -> u) -> CellFormat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CellFormat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CellFormat -> m CellFormat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormat -> m CellFormat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CellFormat -> m CellFormat #

Show CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CellFormat :: Type -> Type #

ToJSON CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CellFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CellFormat = D1 (MetaData "CellFormat" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "CellFormat'" PrefixI True) (((S1 (MetaSel (Just "_cfBOrders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BOrders)) :*: S1 (MetaSel (Just "_cfVerticalAlignment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormatVerticalAlignment))) :*: (S1 (MetaSel (Just "_cfBackgRoundColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: (S1 (MetaSel (Just "_cfTextRotation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextRotation)) :*: S1 (MetaSel (Just "_cfHyperlinkDisplayType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormatHyperlinkDisplayType))))) :*: ((S1 (MetaSel (Just "_cfWrapStrategy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormatWrapStrategy)) :*: (S1 (MetaSel (Just "_cfNumberFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NumberFormat)) :*: S1 (MetaSel (Just "_cfTextDirection") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormatTextDirection)))) :*: (S1 (MetaSel (Just "_cfTextFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: (S1 (MetaSel (Just "_cfHorizontalAlignment") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CellFormatHorizontalAlignment)) :*: S1 (MetaSel (Just "_cfPadding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Padding)))))))

cellFormat :: CellFormat Source #

Creates a value of CellFormat with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cfBOrders :: Lens' CellFormat (Maybe BOrders) Source #

The borders of the cell.

cfVerticalAlignment :: Lens' CellFormat (Maybe CellFormatVerticalAlignment) Source #

The vertical alignment of the value in the cell.

cfBackgRoundColor :: Lens' CellFormat (Maybe Color) Source #

The background color of the cell.

cfTextRotation :: Lens' CellFormat (Maybe TextRotation) Source #

The rotation applied to text in a cell

cfHyperlinkDisplayType :: Lens' CellFormat (Maybe CellFormatHyperlinkDisplayType) Source #

How a hyperlink, if it exists, should be displayed in the cell.

cfWrapStrategy :: Lens' CellFormat (Maybe CellFormatWrapStrategy) Source #

The wrap strategy for the value in the cell.

cfNumberFormat :: Lens' CellFormat (Maybe NumberFormat) Source #

A format describing how number values should be represented to the user.

cfTextDirection :: Lens' CellFormat (Maybe CellFormatTextDirection) Source #

The direction of the text in the cell.

cfTextFormat :: Lens' CellFormat (Maybe TextFormat) Source #

The format of the text in the cell (unless overridden by a format run).

cfHorizontalAlignment :: Lens' CellFormat (Maybe CellFormatHorizontalAlignment) Source #

The horizontal alignment of the value in the cell.

cfPadding :: Lens' CellFormat (Maybe Padding) Source #

The padding of the cell.

DeleteProtectedRangeRequest

data DeleteProtectedRangeRequest Source #

Deletes the protected range with the given ID.

See: deleteProtectedRangeRequest smart constructor.

Instances
Eq DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteProtectedRangeRequest -> c DeleteProtectedRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteProtectedRangeRequest #

toConstr :: DeleteProtectedRangeRequest -> Constr #

dataTypeOf :: DeleteProtectedRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteProtectedRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteProtectedRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteProtectedRangeRequest -> DeleteProtectedRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteProtectedRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteProtectedRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteProtectedRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteProtectedRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteProtectedRangeRequest -> m DeleteProtectedRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteProtectedRangeRequest -> m DeleteProtectedRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteProtectedRangeRequest -> m DeleteProtectedRangeRequest #

Show DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteProtectedRangeRequest :: Type -> Type #

ToJSON DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteProtectedRangeRequest = D1 (MetaData "DeleteProtectedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteProtectedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_dprrProtectedRangeId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

deleteProtectedRangeRequest :: DeleteProtectedRangeRequest Source #

Creates a value of DeleteProtectedRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dprrProtectedRangeId :: Lens' DeleteProtectedRangeRequest (Maybe Int32) Source #

The ID of the protected range to delete.

UpdateProtectedRangeRequest

data UpdateProtectedRangeRequest Source #

Updates an existing protected range with the specified protectedRangeId.

See: updateProtectedRangeRequest smart constructor.

Instances
Eq UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateProtectedRangeRequest -> c UpdateProtectedRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateProtectedRangeRequest #

toConstr :: UpdateProtectedRangeRequest -> Constr #

dataTypeOf :: UpdateProtectedRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateProtectedRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateProtectedRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateProtectedRangeRequest -> UpdateProtectedRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateProtectedRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateProtectedRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateProtectedRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateProtectedRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateProtectedRangeRequest -> m UpdateProtectedRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateProtectedRangeRequest -> m UpdateProtectedRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateProtectedRangeRequest -> m UpdateProtectedRangeRequest #

Show UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateProtectedRangeRequest :: Type -> Type #

ToJSON UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateProtectedRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateProtectedRangeRequest = D1 (MetaData "UpdateProtectedRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateProtectedRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_uprrProtectedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ProtectedRange)) :*: S1 (MetaSel (Just "_uprrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask))))

updateProtectedRangeRequest :: UpdateProtectedRangeRequest Source #

Creates a value of UpdateProtectedRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uprrProtectedRange :: Lens' UpdateProtectedRangeRequest (Maybe ProtectedRange) Source #

The protected range to update with the new properties.

uprrFields :: Lens' UpdateProtectedRangeRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `protectedRange` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

AddSheetResponse

data AddSheetResponse Source #

The result of adding a sheet.

See: addSheetResponse smart constructor.

Instances
Eq AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddSheetResponse -> c AddSheetResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddSheetResponse #

toConstr :: AddSheetResponse -> Constr #

dataTypeOf :: AddSheetResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddSheetResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddSheetResponse) #

gmapT :: (forall b. Data b => b -> b) -> AddSheetResponse -> AddSheetResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddSheetResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddSheetResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddSheetResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddSheetResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddSheetResponse -> m AddSheetResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddSheetResponse -> m AddSheetResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddSheetResponse -> m AddSheetResponse #

Show AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddSheetResponse :: Type -> Type #

ToJSON AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddSheetResponse = D1 (MetaData "AddSheetResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddSheetResponse'" PrefixI True) (S1 (MetaSel (Just "_aProperties") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SheetProperties))))

addSheetResponse :: AddSheetResponse Source #

Creates a value of AddSheetResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aProperties :: Lens' AddSheetResponse (Maybe SheetProperties) Source #

The properties of the newly added sheet.

ProtectedRange

data ProtectedRange Source #

A protected range.

See: protectedRange smart constructor.

Instances
Eq ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ProtectedRange -> c ProtectedRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ProtectedRange #

toConstr :: ProtectedRange -> Constr #

dataTypeOf :: ProtectedRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ProtectedRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ProtectedRange) #

gmapT :: (forall b. Data b => b -> b) -> ProtectedRange -> ProtectedRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ProtectedRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ProtectedRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> ProtectedRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ProtectedRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ProtectedRange -> m ProtectedRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ProtectedRange -> m ProtectedRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ProtectedRange -> m ProtectedRange #

Show ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ProtectedRange :: Type -> Type #

ToJSON ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ProtectedRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ProtectedRange = D1 (MetaData "ProtectedRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ProtectedRange'" PrefixI True) (((S1 (MetaSel (Just "_prProtectedRangeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_prWarningOnly") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_prNamedRangeId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_prRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)))) :*: ((S1 (MetaSel (Just "_prEditors") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Editors)) :*: S1 (MetaSel (Just "_prUnprotectedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GridRange]))) :*: (S1 (MetaSel (Just "_prRequestingUserCanEdit") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_prDescription") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

protectedRange :: ProtectedRange Source #

Creates a value of ProtectedRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

prProtectedRangeId :: Lens' ProtectedRange (Maybe Int32) Source #

The ID of the protected range. This field is read-only.

prWarningOnly :: Lens' ProtectedRange (Maybe Bool) Source #

True if this protected range will show a warning when editing. Warning-based protection means that every user can edit data in the protected range, except editing will prompt a warning asking the user to confirm the edit. When writing: if this field is true, then editors is ignored. Additionally, if this field is changed from true to false and the `editors` field is not set (nor included in the field mask), then the editors will be set to all the editors in the document.

prNamedRangeId :: Lens' ProtectedRange (Maybe Text) Source #

The named range this protected range is backed by, if any. When writing, only one of range or named_range_id may be set.

prRange :: Lens' ProtectedRange (Maybe GridRange) Source #

The range that is being protected. The range may be fully unbounded, in which case this is considered a protected sheet. When writing, only one of range or named_range_id may be set.

prEditors :: Lens' ProtectedRange (Maybe Editors) Source #

The users and groups with edit access to the protected range. This field is only visible to users with edit access to the protected range and the document. Editors are not supported with warning_only protection.

prUnprotectedRanges :: Lens' ProtectedRange [GridRange] Source #

The list of unprotected ranges within a protected sheet. Unprotected ranges are only supported on protected sheets.

prRequestingUserCanEdit :: Lens' ProtectedRange (Maybe Bool) Source #

True if the user who requested this protected range can edit the protected area. This field is read-only.

prDescription :: Lens' ProtectedRange (Maybe Text) Source #

The description of this protected range.

PivotValueCalculatedDisplayType

data PivotValueCalculatedDisplayType Source #

If specified, indicates that pivot values should be displayed as the result of a calculation with another pivot value. For example, if calculated_display_type is specified as PERCENT_OF_GRAND_TOTAL, all the pivot values are displayed as the percentage of the grand total. In the Sheets UI, this is referred to as "Show As" in the value section of a pivot table.

Constructors

PivotValueCalculatedDisplayTypeUnspecified

PIVOT_VALUE_CALCULATED_DISPLAY_TYPE_UNSPECIFIED Default value, do not use.

PercentOfRowTotal

PERCENT_OF_ROW_TOTAL Shows the pivot values as percentage of the row total values.

PercentOfColumnTotal

PERCENT_OF_COLUMN_TOTAL Shows the pivot values as percentage of the column total values.

PercentOfGrandTotal

PERCENT_OF_GRAND_TOTAL Shows the pivot values as percentage of the grand total values.

Instances
Enum PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotValueCalculatedDisplayType -> c PivotValueCalculatedDisplayType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotValueCalculatedDisplayType #

toConstr :: PivotValueCalculatedDisplayType -> Constr #

dataTypeOf :: PivotValueCalculatedDisplayType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotValueCalculatedDisplayType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotValueCalculatedDisplayType) #

gmapT :: (forall b. Data b => b -> b) -> PivotValueCalculatedDisplayType -> PivotValueCalculatedDisplayType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotValueCalculatedDisplayType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotValueCalculatedDisplayType -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotValueCalculatedDisplayType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotValueCalculatedDisplayType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotValueCalculatedDisplayType -> m PivotValueCalculatedDisplayType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValueCalculatedDisplayType -> m PivotValueCalculatedDisplayType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotValueCalculatedDisplayType -> m PivotValueCalculatedDisplayType #

Ord PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PivotValueCalculatedDisplayType :: Type -> Type #

Hashable PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotValueCalculatedDisplayType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotValueCalculatedDisplayType = D1 (MetaData "PivotValueCalculatedDisplayType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "PivotValueCalculatedDisplayTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PercentOfRowTotal" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "PercentOfColumnTotal" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "PercentOfGrandTotal" PrefixI False) (U1 :: Type -> Type)))

BasicChartAxis

data BasicChartAxis Source #

An axis of the chart. A chart may not have more than one axis per axis position.

See: basicChartAxis smart constructor.

Instances
Eq BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartAxis -> c BasicChartAxis #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartAxis #

toConstr :: BasicChartAxis -> Constr #

dataTypeOf :: BasicChartAxis -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartAxis) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartAxis) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartAxis -> BasicChartAxis #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartAxis -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartAxis -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartAxis -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartAxis -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartAxis -> m BasicChartAxis #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartAxis -> m BasicChartAxis #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartAxis -> m BasicChartAxis #

Show BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicChartAxis :: Type -> Type #

ToJSON BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartAxis Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartAxis = D1 (MetaData "BasicChartAxis" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BasicChartAxis'" PrefixI True) ((S1 (MetaSel (Just "_bcaTitleTextPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextPosition)) :*: S1 (MetaSel (Just "_bcaFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat))) :*: (S1 (MetaSel (Just "_bcaTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bcaPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartAxisPosition)))))

basicChartAxis :: BasicChartAxis Source #

Creates a value of BasicChartAxis with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bcaFormat :: Lens' BasicChartAxis (Maybe TextFormat) Source #

The format of the title. Only valid if the axis is not associated with the domain.

bcaTitle :: Lens' BasicChartAxis (Maybe Text) Source #

The title of this axis. If set, this overrides any title inferred from headers of the data.

GridData

data GridData Source #

Data in the grid, as well as metadata about the dimensions.

See: gridData smart constructor.

Instances
Eq GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> GridData -> c GridData #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c GridData #

toConstr :: GridData -> Constr #

dataTypeOf :: GridData -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c GridData) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c GridData) #

gmapT :: (forall b. Data b => b -> b) -> GridData -> GridData #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> GridData -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> GridData -> r #

gmapQ :: (forall d. Data d => d -> u) -> GridData -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> GridData -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> GridData -> m GridData #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> GridData -> m GridData #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> GridData -> m GridData #

Show GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep GridData :: Type -> Type #

Methods

from :: GridData -> Rep GridData x #

to :: Rep GridData x -> GridData #

ToJSON GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridData Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep GridData = D1 (MetaData "GridData" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "GridData'" PrefixI True) ((S1 (MetaSel (Just "_gdRowMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DimensionProperties])) :*: S1 (MetaSel (Just "_gdStartRow") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_gdRowData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [RowData])) :*: (S1 (MetaSel (Just "_gdColumnMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DimensionProperties])) :*: S1 (MetaSel (Just "_gdStartColumn") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))))

gridData :: GridData Source #

Creates a value of GridData with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

gdRowMetadata :: Lens' GridData [DimensionProperties] Source #

Metadata about the requested rows in the grid, starting with the row in start_row.

gdStartRow :: Lens' GridData (Maybe Int32) Source #

The first row this GridData refers to, zero-based.

gdRowData :: Lens' GridData [RowData] Source #

The data in the grid, one entry per row, starting with the row in startRow. The values in RowData will correspond to columns starting at start_column.

gdColumnMetadata :: Lens' GridData [DimensionProperties] Source #

Metadata about the requested columns in the grid, starting with the column in start_column.

gdStartColumn :: Lens' GridData (Maybe Int32) Source #

The first column this GridData refers to, zero-based.

NumberFormat

data NumberFormat Source #

The number format of a cell.

See: numberFormat smart constructor.

Instances
Eq NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> NumberFormat -> c NumberFormat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c NumberFormat #

toConstr :: NumberFormat -> Constr #

dataTypeOf :: NumberFormat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c NumberFormat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c NumberFormat) #

gmapT :: (forall b. Data b => b -> b) -> NumberFormat -> NumberFormat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> NumberFormat -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> NumberFormat -> r #

gmapQ :: (forall d. Data d => d -> u) -> NumberFormat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> NumberFormat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> NumberFormat -> m NumberFormat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> NumberFormat -> m NumberFormat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> NumberFormat -> m NumberFormat #

Show NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep NumberFormat :: Type -> Type #

ToJSON NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep NumberFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep NumberFormat = D1 (MetaData "NumberFormat" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "NumberFormat'" PrefixI True) (S1 (MetaSel (Just "_nfPattern") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_nfType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe NumberFormatType))))

numberFormat :: NumberFormat Source #

Creates a value of NumberFormat with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

nfPattern :: Lens' NumberFormat (Maybe Text) Source #

Pattern string used for formatting. If not set, a default pattern based on the user's locale will be used if necessary for the given type. See the Date and Number Formats guide for more information about the supported patterns.

nfType :: Lens' NumberFormat (Maybe NumberFormatType) Source #

The type of the number format. When writing, this field must be set.

BatchGetValuesByDataFilterRequestDateTimeRenderOption

data BatchGetValuesByDataFilterRequestDateTimeRenderOption Source #

How dates, times, and durations should be represented in the output. This is ignored if value_render_option is FORMATTED_VALUE. The default dateTime render option is [DateTimeRenderOption.SERIAL_NUMBER].

Constructors

BGVBDFRDTROSerialNumber

SERIAL_NUMBER Instructs date, time, datetime, and duration fields to be output as doubles in "serial number" format, as popularized by Lotus 1-2-3. The whole number portion of the value (left of the decimal) counts the days since December 30th 1899. The fractional portion (right of the decimal) counts the time as a fraction of the day. For example, January 1st 1900 at noon would be 2.5, 2 because it's 2 days after December 30st 1899, and .5 because noon is half a day. February 1st 1900 at 3pm would be 33.625. This correctly treats the year 1900 as not a leap year.

BGVBDFRDTROFormattedString

FORMATTED_STRING Instructs date, time, datetime, and duration fields to be output as strings in their given number format (which is dependent on the spreadsheet locale).

Instances
Enum BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> c BatchGetValuesByDataFilterRequestDateTimeRenderOption #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchGetValuesByDataFilterRequestDateTimeRenderOption #

toConstr :: BatchGetValuesByDataFilterRequestDateTimeRenderOption -> Constr #

dataTypeOf :: BatchGetValuesByDataFilterRequestDateTimeRenderOption -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchGetValuesByDataFilterRequestDateTimeRenderOption) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchGetValuesByDataFilterRequestDateTimeRenderOption) #

gmapT :: (forall b. Data b => b -> b) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> BatchGetValuesByDataFilterRequestDateTimeRenderOption #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> m BatchGetValuesByDataFilterRequestDateTimeRenderOption #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> m BatchGetValuesByDataFilterRequestDateTimeRenderOption #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestDateTimeRenderOption -> m BatchGetValuesByDataFilterRequestDateTimeRenderOption #

Ord BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestDateTimeRenderOption Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestDateTimeRenderOption = D1 (MetaData "BatchGetValuesByDataFilterRequestDateTimeRenderOption" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BGVBDFRDTROSerialNumber" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BGVBDFRDTROFormattedString" PrefixI False) (U1 :: Type -> Type))

BatchUpdateSpreadsheetResponse

data BatchUpdateSpreadsheetResponse Source #

The reply for batch updating a spreadsheet.

See: batchUpdateSpreadsheetResponse smart constructor.

Instances
Eq BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchUpdateSpreadsheetResponse -> c BatchUpdateSpreadsheetResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchUpdateSpreadsheetResponse #

toConstr :: BatchUpdateSpreadsheetResponse -> Constr #

dataTypeOf :: BatchUpdateSpreadsheetResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchUpdateSpreadsheetResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchUpdateSpreadsheetResponse) #

gmapT :: (forall b. Data b => b -> b) -> BatchUpdateSpreadsheetResponse -> BatchUpdateSpreadsheetResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateSpreadsheetResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchUpdateSpreadsheetResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchUpdateSpreadsheetResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchUpdateSpreadsheetResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetResponse -> m BatchUpdateSpreadsheetResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetResponse -> m BatchUpdateSpreadsheetResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchUpdateSpreadsheetResponse -> m BatchUpdateSpreadsheetResponse #

Show BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchUpdateSpreadsheetResponse :: Type -> Type #

ToJSON BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateSpreadsheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchUpdateSpreadsheetResponse = D1 (MetaData "BatchUpdateSpreadsheetResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchUpdateSpreadsheetResponse'" PrefixI True) (S1 (MetaSel (Just "_busrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: (S1 (MetaSel (Just "_busrReplies") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Response])) :*: S1 (MetaSel (Just "_busrUpdatedSpreadsheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Spreadsheet)))))

batchUpdateSpreadsheetResponse :: BatchUpdateSpreadsheetResponse Source #

Creates a value of BatchUpdateSpreadsheetResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

busrSpreadsheetId :: Lens' BatchUpdateSpreadsheetResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

busrReplies :: Lens' BatchUpdateSpreadsheetResponse [Response] Source #

The reply of the updates. This maps 1:1 with the updates, although replies to some requests may be empty.

busrUpdatedSpreadsheet :: Lens' BatchUpdateSpreadsheetResponse (Maybe Spreadsheet) Source #

The spreadsheet after updates were applied. This is only set if [BatchUpdateSpreadsheetRequest.include_spreadsheet_in_response] is `true`.

DataFilter

data DataFilter Source #

Filter that describes what data should be selected or returned from a request.

See: dataFilter smart constructor.

Instances
Eq DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DataFilter -> c DataFilter #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DataFilter #

toConstr :: DataFilter -> Constr #

dataTypeOf :: DataFilter -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DataFilter) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DataFilter) #

gmapT :: (forall b. Data b => b -> b) -> DataFilter -> DataFilter #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DataFilter -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DataFilter -> r #

gmapQ :: (forall d. Data d => d -> u) -> DataFilter -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DataFilter -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DataFilter -> m DataFilter #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DataFilter -> m DataFilter #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DataFilter -> m DataFilter #

Show DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DataFilter :: Type -> Type #

ToJSON DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataFilter Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DataFilter = D1 (MetaData "DataFilter" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DataFilter'" PrefixI True) (S1 (MetaSel (Just "_dfGridRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange)) :*: (S1 (MetaSel (Just "_dfA1Range") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dfDeveloperMetadataLookup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadataLookup)))))

dataFilter :: DataFilter Source #

Creates a value of DataFilter with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dfGridRange :: Lens' DataFilter (Maybe GridRange) Source #

Selects data that matches the range described by the GridRange.

dfA1Range :: Lens' DataFilter (Maybe Text) Source #

Selects data that matches the specified A1 range.

dfDeveloperMetadataLookup :: Lens' DataFilter (Maybe DeveloperMetadataLookup) Source #

Selects data associated with the developer metadata matching the criteria described by this DeveloperMetadataLookup.

SetDataValidationRequest

data SetDataValidationRequest Source #

Sets a data validation rule to every cell in the range. To clear validation in a range, call this with no rule specified.

See: setDataValidationRequest smart constructor.

Instances
Eq SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> SetDataValidationRequest -> c SetDataValidationRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c SetDataValidationRequest #

toConstr :: SetDataValidationRequest -> Constr #

dataTypeOf :: SetDataValidationRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c SetDataValidationRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c SetDataValidationRequest) #

gmapT :: (forall b. Data b => b -> b) -> SetDataValidationRequest -> SetDataValidationRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> SetDataValidationRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> SetDataValidationRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> SetDataValidationRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> SetDataValidationRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> SetDataValidationRequest -> m SetDataValidationRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> SetDataValidationRequest -> m SetDataValidationRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> SetDataValidationRequest -> m SetDataValidationRequest #

Show SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep SetDataValidationRequest :: Type -> Type #

ToJSON SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SetDataValidationRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep SetDataValidationRequest = D1 (MetaData "SetDataValidationRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "SetDataValidationRequest'" PrefixI True) (S1 (MetaSel (Just "_sdvrRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DataValidationRule)) :*: S1 (MetaSel (Just "_sdvrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))))

setDataValidationRequest :: SetDataValidationRequest Source #

Creates a value of SetDataValidationRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

sdvrRule :: Lens' SetDataValidationRequest (Maybe DataValidationRule) Source #

The data validation rule to set on each cell in the range, or empty to clear the data validation in the range.

sdvrRange :: Lens' SetDataValidationRequest (Maybe GridRange) Source #

The range the data validation rule should apply to.

BandingProperties

data BandingProperties Source #

Properties referring a single dimension (either row or column). If both BandedRange.row_properties and BandedRange.column_properties are set, the fill colors are applied to cells according to the following rules: * header_color and footer_color take priority over band colors. * first_band_color takes priority over second_band_color. * row_properties takes priority over column_properties. For example, the first row color takes priority over the first column color, but the first column color takes priority over the second row color. Similarly, the row header takes priority over the column header in the top left cell, but the column header takes priority over the first row color if the row header is not set.

See: bandingProperties smart constructor.

Instances
Eq BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BandingProperties -> c BandingProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BandingProperties #

toConstr :: BandingProperties -> Constr #

dataTypeOf :: BandingProperties -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BandingProperties) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BandingProperties) #

gmapT :: (forall b. Data b => b -> b) -> BandingProperties -> BandingProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BandingProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BandingProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> BandingProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BandingProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BandingProperties -> m BandingProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BandingProperties -> m BandingProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BandingProperties -> m BandingProperties #

Show BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BandingProperties :: Type -> Type #

ToJSON BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BandingProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BandingProperties = D1 (MetaData "BandingProperties" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BandingProperties'" PrefixI True) ((S1 (MetaSel (Just "_bpSecondBandColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_bpHeaderColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color))) :*: (S1 (MetaSel (Just "_bpFooterColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_bpFirstBandColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)))))

bandingProperties :: BandingProperties Source #

Creates a value of BandingProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bpSecondBandColor :: Lens' BandingProperties (Maybe Color) Source #

The second color that is alternating. (Required)

bpHeaderColor :: Lens' BandingProperties (Maybe Color) Source #

The color of the first row or column. If this field is set, the first row or column will be filled with this color and the colors will alternate between first_band_color and second_band_color starting from the second row or column. Otherwise, the first row or column will be filled with first_band_color and the colors will proceed to alternate as they normally would.

bpFooterColor :: Lens' BandingProperties (Maybe Color) Source #

The color of the last row or column. If this field is not set, the last row or column will be filled with either first_band_color or second_band_color, depending on the color of the previous row or column.

bpFirstBandColor :: Lens' BandingProperties (Maybe Color) Source #

The first color that is alternating. (Required)

ChartSpecHiddenDimensionStrategy

data ChartSpecHiddenDimensionStrategy Source #

Determines how the charts will use hidden rows or columns.

Constructors

ChartHiddenDimensionStrategyUnspecified

CHART_HIDDEN_DIMENSION_STRATEGY_UNSPECIFIED Default value, do not use.

SkipHiddenRowsAndColumns

SKIP_HIDDEN_ROWS_AND_COLUMNS Charts will skip hidden rows and columns.

SkipHiddenRows

SKIP_HIDDEN_ROWS Charts will skip hidden rows only.

SkipHiddenColumns

SKIP_HIDDEN_COLUMNS Charts will skip hidden columns only.

ShowAll

SHOW_ALL Charts will not skip any hidden rows or columns.

Instances
Enum ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChartSpecHiddenDimensionStrategy -> c ChartSpecHiddenDimensionStrategy #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChartSpecHiddenDimensionStrategy #

toConstr :: ChartSpecHiddenDimensionStrategy -> Constr #

dataTypeOf :: ChartSpecHiddenDimensionStrategy -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ChartSpecHiddenDimensionStrategy) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChartSpecHiddenDimensionStrategy) #

gmapT :: (forall b. Data b => b -> b) -> ChartSpecHiddenDimensionStrategy -> ChartSpecHiddenDimensionStrategy #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChartSpecHiddenDimensionStrategy -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChartSpecHiddenDimensionStrategy -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChartSpecHiddenDimensionStrategy -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChartSpecHiddenDimensionStrategy -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChartSpecHiddenDimensionStrategy -> m ChartSpecHiddenDimensionStrategy #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSpecHiddenDimensionStrategy -> m ChartSpecHiddenDimensionStrategy #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSpecHiddenDimensionStrategy -> m ChartSpecHiddenDimensionStrategy #

Ord ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep ChartSpecHiddenDimensionStrategy :: Type -> Type #

Hashable ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ChartSpecHiddenDimensionStrategy Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ChartSpecHiddenDimensionStrategy = D1 (MetaData "ChartSpecHiddenDimensionStrategy" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "ChartHiddenDimensionStrategyUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SkipHiddenRowsAndColumns" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "SkipHiddenRows" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "SkipHiddenColumns" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "ShowAll" PrefixI False) (U1 :: Type -> Type))))

DuplicateFilterViewRequest

data DuplicateFilterViewRequest Source #

Duplicates a particular filter view.

See: duplicateFilterViewRequest smart constructor.

Instances
Eq DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DuplicateFilterViewRequest -> c DuplicateFilterViewRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DuplicateFilterViewRequest #

toConstr :: DuplicateFilterViewRequest -> Constr #

dataTypeOf :: DuplicateFilterViewRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DuplicateFilterViewRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DuplicateFilterViewRequest) #

gmapT :: (forall b. Data b => b -> b) -> DuplicateFilterViewRequest -> DuplicateFilterViewRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateFilterViewRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateFilterViewRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DuplicateFilterViewRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DuplicateFilterViewRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DuplicateFilterViewRequest -> m DuplicateFilterViewRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateFilterViewRequest -> m DuplicateFilterViewRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateFilterViewRequest -> m DuplicateFilterViewRequest #

Show DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DuplicateFilterViewRequest :: Type -> Type #

ToJSON DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateFilterViewRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateFilterViewRequest = D1 (MetaData "DuplicateFilterViewRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DuplicateFilterViewRequest'" PrefixI True) (S1 (MetaSel (Just "_dFilterId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

duplicateFilterViewRequest :: DuplicateFilterViewRequest Source #

Creates a value of DuplicateFilterViewRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dFilterId :: Lens' DuplicateFilterViewRequest (Maybe Int32) Source #

The ID of the filter being duplicated.

BOrderStyle

data BOrderStyle Source #

The style of the border.

Constructors

StyleUnspecified

STYLE_UNSPECIFIED The style is not specified. Do not use this.

Dotted

DOTTED The border is dotted.

Dashed

DASHED The border is dashed.

Solid

SOLID The border is a thin solid line.

SolidMedium

SOLID_MEDIUM The border is a medium solid line.

SolidThick

SOLID_THICK The border is a thick solid line.

None

NONE No border. Used only when updating a border in order to erase it.

Double

DOUBLE The border is two solid lines.

Instances
Enum BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BOrderStyle -> c BOrderStyle #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BOrderStyle #

toConstr :: BOrderStyle -> Constr #

dataTypeOf :: BOrderStyle -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BOrderStyle) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BOrderStyle) #

gmapT :: (forall b. Data b => b -> b) -> BOrderStyle -> BOrderStyle #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BOrderStyle -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BOrderStyle -> r #

gmapQ :: (forall d. Data d => d -> u) -> BOrderStyle -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BOrderStyle -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BOrderStyle -> m BOrderStyle #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BOrderStyle -> m BOrderStyle #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BOrderStyle -> m BOrderStyle #

Ord BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BOrderStyle :: Type -> Type #

Hashable BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BOrderStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BOrderStyle = D1 (MetaData "BOrderStyle" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "StyleUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Dotted" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Dashed" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Solid" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "SolidMedium" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "SolidThick" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "None" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Double" PrefixI False) (U1 :: Type -> Type))))

PivotGroup

data PivotGroup Source #

A single grouping (either row or column) in a pivot table.

See: pivotGroup smart constructor.

Instances
Eq PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotGroup -> c PivotGroup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotGroup #

toConstr :: PivotGroup -> Constr #

dataTypeOf :: PivotGroup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotGroup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotGroup) #

gmapT :: (forall b. Data b => b -> b) -> PivotGroup -> PivotGroup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroup -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotGroup -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotGroup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotGroup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotGroup -> m PivotGroup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroup -> m PivotGroup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotGroup -> m PivotGroup #

Show PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep PivotGroup :: Type -> Type #

ToJSON PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep PivotGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

pivotGroup :: PivotGroup Source #

Creates a value of PivotGroup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pgRepeatHeadings :: Lens' PivotGroup (Maybe Bool) Source #

True if the headings in this pivot group should be repeated. This is only valid for row groupings and is ignored by columns. By default, we minimize repitition of headings by not showing higher level headings where they are the same. For example, even though the third row below corresponds to "Q1 Mar", "Q1" is not shown because it is redundant with previous rows. Setting repeat_headings to true would cause "Q1" to be repeated for "Feb" and "Mar". +--------------+ | Q1 | Jan | | | Feb | | | Mar | +--------+-----+ | Q1 Total | +--------------+

pgValueMetadata :: Lens' PivotGroup [PivotGroupValueMetadata] Source #

Metadata about values in the grouping.

pgSourceColumnOffSet :: Lens' PivotGroup (Maybe Int32) Source #

The column offset of the source range that this grouping is based on. For example, if the source was `C10:E15`, a `sourceColumnOffset` of `0` means this group refers to column `C`, whereas the offset `1` would refer to column `D`.

pgSortOrder :: Lens' PivotGroup (Maybe PivotGroupSortOrder) Source #

The order the values in this group should be sorted.

pgShowTotals :: Lens' PivotGroup (Maybe Bool) Source #

True if the pivot table should include the totals for this grouping.

pgValueBucket :: Lens' PivotGroup (Maybe PivotGroupSortValueBucket) Source #

The bucket of the opposite pivot group to sort by. If not specified, sorting is alphabetical by this group's values.

pgLabel :: Lens' PivotGroup (Maybe Text) Source #

The labels to use for the row/column groups which can be customized. For example, in the following pivot table, the row label is `Region` (which could be renamed to `State`) and the column label is `Product` (which could be renamed `Item`). Pivot tables created before December 2017 do not have header labels. If you'd like to add header labels to an existing pivot table, please delete the existing pivot table and then create a new pivot table with same parameters. +--------------+---------+-------+ | SUM of Units | Product | | | Region | Pen | Paper | +--------------+---------+-------+ | New York | 345 | 98 | | Oregon | 234 | 123 | | Tennessee | 531 | 415 | +--------------+---------+-------+ | Grand Total | 1110 | 636 | +--------------+---------+-------+

pgGroupRule :: Lens' PivotGroup (Maybe PivotGroupRule) Source #

The group rule to apply to this row/column group.

AddBandingResponse

data AddBandingResponse Source #

The result of adding a banded range.

See: addBandingResponse smart constructor.

Instances
Eq AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddBandingResponse -> c AddBandingResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddBandingResponse #

toConstr :: AddBandingResponse -> Constr #

dataTypeOf :: AddBandingResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddBandingResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddBandingResponse) #

gmapT :: (forall b. Data b => b -> b) -> AddBandingResponse -> AddBandingResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddBandingResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddBandingResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddBandingResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddBandingResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddBandingResponse -> m AddBandingResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddBandingResponse -> m AddBandingResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddBandingResponse -> m AddBandingResponse #

Show AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddBandingResponse :: Type -> Type #

ToJSON AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddBandingResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddBandingResponse = D1 (MetaData "AddBandingResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "AddBandingResponse'" PrefixI True) (S1 (MetaSel (Just "_aBandedRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe BandedRange))))

addBandingResponse :: AddBandingResponse Source #

Creates a value of AddBandingResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

aBandedRange :: Lens' AddBandingResponse (Maybe BandedRange) Source #

The banded range that was added.

OrgChartSpec

data OrgChartSpec Source #

An org chart. Org charts require a unique set of labels in labels and may optionally include parent_labels and tooltips. parent_labels contain, for each node, the label identifying the parent node. tooltips contain, for each node, an optional tooltip. For example, to describe an OrgChart with Alice as the CEO, Bob as the President (reporting to Alice) and Cathy as VP of Sales (also reporting to Alice), have labels contain "Alice", "Bob", "Cathy", parent_labels contain "", "Alice", "Alice" and tooltips contain "CEO", "President", "VP Sales".

See: orgChartSpec smart constructor.

Instances
Eq OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> OrgChartSpec -> c OrgChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c OrgChartSpec #

toConstr :: OrgChartSpec -> Constr #

dataTypeOf :: OrgChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c OrgChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c OrgChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> OrgChartSpec -> OrgChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> OrgChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> OrgChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> OrgChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> OrgChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> OrgChartSpec -> m OrgChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> OrgChartSpec -> m OrgChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> OrgChartSpec -> m OrgChartSpec #

Show OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep OrgChartSpec :: Type -> Type #

ToJSON OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep OrgChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep OrgChartSpec = D1 (MetaData "OrgChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "OrgChartSpec'" PrefixI True) ((S1 (MetaSel (Just "_ocsNodeColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: (S1 (MetaSel (Just "_ocsNodeSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrgChartSpecNodeSize)) :*: S1 (MetaSel (Just "_ocsTooltips") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)))) :*: (S1 (MetaSel (Just "_ocsSelectedNodeColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: (S1 (MetaSel (Just "_ocsLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_ocsParentLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))))

orgChartSpec :: OrgChartSpec Source #

Creates a value of OrgChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ocsNodeColor :: Lens' OrgChartSpec (Maybe Color) Source #

The color of the org chart nodes.

ocsNodeSize :: Lens' OrgChartSpec (Maybe OrgChartSpecNodeSize) Source #

The size of the org chart nodes.

ocsTooltips :: Lens' OrgChartSpec (Maybe ChartData) Source #

The data containing the tooltip for the corresponding node. A blank value results in no tooltip being displayed for the node. This field is optional.

ocsSelectedNodeColor :: Lens' OrgChartSpec (Maybe Color) Source #

The color of the selected org chart nodes.

ocsLabels :: Lens' OrgChartSpec (Maybe ChartData) Source #

The data containing the labels for all the nodes in the chart. Labels must be unique.

ocsParentLabels :: Lens' OrgChartSpec (Maybe ChartData) Source #

The data containing the label of the parent for the corresponding node. A blank value indicates that the node has no parent and is a top-level node. This field is optional.

CutPasteRequestPasteType

data CutPasteRequestPasteType Source #

What kind of data to paste. All the source data will be cut, regardless of what is pasted.

Constructors

CPRPTPasteNormal

PASTE_NORMAL Paste values, formulas, formats, and merges.

CPRPTPasteValues

PASTE_VALUES Paste the values ONLY without formats, formulas, or merges.

CPRPTPasteFormat

PASTE_FORMAT Paste the format and data validation only.

CPRPTPasteNoBOrders

PASTE_NO_BORDERS Like PASTE_NORMAL but without borders.

CPRPTPasteFormula

PASTE_FORMULA Paste the formulas only.

CPRPTPasteDataValidation

PASTE_DATA_VALIDATION Paste the data validation only.

CPRPTPasteConditionalFormatting

PASTE_CONDITIONAL_FORMATTING Paste the conditional formatting rules only.

Instances
Enum CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CutPasteRequestPasteType -> c CutPasteRequestPasteType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CutPasteRequestPasteType #

toConstr :: CutPasteRequestPasteType -> Constr #

dataTypeOf :: CutPasteRequestPasteType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CutPasteRequestPasteType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CutPasteRequestPasteType) #

gmapT :: (forall b. Data b => b -> b) -> CutPasteRequestPasteType -> CutPasteRequestPasteType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CutPasteRequestPasteType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CutPasteRequestPasteType -> r #

gmapQ :: (forall d. Data d => d -> u) -> CutPasteRequestPasteType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CutPasteRequestPasteType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CutPasteRequestPasteType -> m CutPasteRequestPasteType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CutPasteRequestPasteType -> m CutPasteRequestPasteType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CutPasteRequestPasteType -> m CutPasteRequestPasteType #

Ord CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep CutPasteRequestPasteType :: Type -> Type #

Hashable CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CutPasteRequestPasteType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep CutPasteRequestPasteType = D1 (MetaData "CutPasteRequestPasteType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "CPRPTPasteNormal" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "CPRPTPasteValues" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CPRPTPasteFormat" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "CPRPTPasteNoBOrders" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CPRPTPasteFormula" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "CPRPTPasteDataValidation" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "CPRPTPasteConditionalFormatting" PrefixI False) (U1 :: Type -> Type))))

BasicChartSpecLegendPosition

data BasicChartSpecLegendPosition Source #

The position of the chart legend.

Constructors

BCSLPBasicChartLegendPositionUnspecified

BASIC_CHART_LEGEND_POSITION_UNSPECIFIED Default value, do not use.

BCSLPBottomLegend

BOTTOM_LEGEND The legend is rendered on the bottom of the chart.

BCSLPLeftLegend

LEFT_LEGEND The legend is rendered on the left of the chart.

BCSLPRightLegend

RIGHT_LEGEND The legend is rendered on the right of the chart.

BCSLPTopLegend

TOP_LEGEND The legend is rendered on the top of the chart.

BCSLPNoLegend

NO_LEGEND No legend is rendered.

Instances
Enum BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSpecLegendPosition -> c BasicChartSpecLegendPosition #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSpecLegendPosition #

toConstr :: BasicChartSpecLegendPosition -> Constr #

dataTypeOf :: BasicChartSpecLegendPosition -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSpecLegendPosition) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSpecLegendPosition) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSpecLegendPosition -> BasicChartSpecLegendPosition #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecLegendPosition -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpecLegendPosition -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSpecLegendPosition -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSpecLegendPosition -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSpecLegendPosition -> m BasicChartSpecLegendPosition #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecLegendPosition -> m BasicChartSpecLegendPosition #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpecLegendPosition -> m BasicChartSpecLegendPosition #

Ord BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep BasicChartSpecLegendPosition :: Type -> Type #

Hashable BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecLegendPosition Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BasicChartSpecLegendPosition = D1 (MetaData "BasicChartSpecLegendPosition" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "BCSLPBasicChartLegendPositionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BCSLPBottomLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSLPLeftLegend" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "BCSLPRightLegend" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BCSLPTopLegend" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BCSLPNoLegend" PrefixI False) (U1 :: Type -> Type))))

ErrorValueType

data ErrorValueType Source #

The type of error.

Constructors

ErrorTypeUnspecified

ERROR_TYPE_UNSPECIFIED The default error type, do not use this.

Error'

ERROR Corresponds to the `#ERROR!` error.

NullValue

NULL_VALUE Corresponds to the `#NULL!` error.

DivideByZero

DIVIDE_BY_ZERO Corresponds to the `#DIV/0` error.

Value

VALUE Corresponds to the `#VALUE!` error.

Ref

REF Corresponds to the `#REF!` error.

Name

NAME Corresponds to the `#NAME?` error.

Num

NUM Corresponds to the `#NUM`! error.

NA

N_A Corresponds to the `#N/A` error.

Loading

LOADING Corresponds to the `Loading...` state.

Instances
Enum ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ErrorValueType -> c ErrorValueType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ErrorValueType #

toConstr :: ErrorValueType -> Constr #

dataTypeOf :: ErrorValueType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ErrorValueType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ErrorValueType) #

gmapT :: (forall b. Data b => b -> b) -> ErrorValueType -> ErrorValueType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ErrorValueType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ErrorValueType -> r #

gmapQ :: (forall d. Data d => d -> u) -> ErrorValueType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ErrorValueType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ErrorValueType -> m ErrorValueType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorValueType -> m ErrorValueType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ErrorValueType -> m ErrorValueType #

Ord ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep ErrorValueType :: Type -> Type #

Hashable ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ErrorValueType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep ErrorValueType = D1 (MetaData "ErrorValueType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (((C1 (MetaCons "ErrorTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Error'" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "NullValue" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "DivideByZero" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Value" PrefixI False) (U1 :: Type -> Type)))) :+: ((C1 (MetaCons "Ref" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Name" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "Num" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "NA" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Loading" PrefixI False) (U1 :: Type -> Type)))))

RandomizeRangeRequest

data RandomizeRangeRequest Source #

Randomizes the order of the rows in a range.

See: randomizeRangeRequest smart constructor.

Instances
Eq RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> RandomizeRangeRequest -> c RandomizeRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c RandomizeRangeRequest #

toConstr :: RandomizeRangeRequest -> Constr #

dataTypeOf :: RandomizeRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c RandomizeRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c RandomizeRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> RandomizeRangeRequest -> RandomizeRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> RandomizeRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> RandomizeRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> RandomizeRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> RandomizeRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> RandomizeRangeRequest -> m RandomizeRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> RandomizeRangeRequest -> m RandomizeRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> RandomizeRangeRequest -> m RandomizeRangeRequest #

Show RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep RandomizeRangeRequest :: Type -> Type #

ToJSON RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RandomizeRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep RandomizeRangeRequest = D1 (MetaData "RandomizeRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "RandomizeRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_rrrRange") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe GridRange))))

randomizeRangeRequest :: RandomizeRangeRequest Source #

Creates a value of RandomizeRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

HistogramSeries

data HistogramSeries Source #

A histogram series containing the series color and data.

See: histogramSeries smart constructor.

Instances
Eq HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HistogramSeries -> c HistogramSeries #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HistogramSeries #

toConstr :: HistogramSeries -> Constr #

dataTypeOf :: HistogramSeries -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HistogramSeries) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HistogramSeries) #

gmapT :: (forall b. Data b => b -> b) -> HistogramSeries -> HistogramSeries #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HistogramSeries -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HistogramSeries -> r #

gmapQ :: (forall d. Data d => d -> u) -> HistogramSeries -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HistogramSeries -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HistogramSeries -> m HistogramSeries #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramSeries -> m HistogramSeries #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramSeries -> m HistogramSeries #

Show HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep HistogramSeries :: Type -> Type #

ToJSON HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramSeries Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramSeries = D1 (MetaData "HistogramSeries" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "HistogramSeries'" PrefixI True) (S1 (MetaSel (Just "_hsBarColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_hsData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))

histogramSeries :: HistogramSeries Source #

Creates a value of HistogramSeries with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hsBarColor :: Lens' HistogramSeries (Maybe Color) Source #

The color of the column representing this series in each bucket. This field is optional.

hsData :: Lens' HistogramSeries (Maybe ChartData) Source #

The data for this histogram series.

TreemapChartSpec

data TreemapChartSpec Source #

A Treemap chart.

See: treemapChartSpec smart constructor.

Instances
Eq TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TreemapChartSpec -> c TreemapChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TreemapChartSpec #

toConstr :: TreemapChartSpec -> Constr #

dataTypeOf :: TreemapChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TreemapChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TreemapChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> TreemapChartSpec -> TreemapChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TreemapChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TreemapChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> TreemapChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TreemapChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TreemapChartSpec -> m TreemapChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TreemapChartSpec -> m TreemapChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TreemapChartSpec -> m TreemapChartSpec #

Show TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TreemapChartSpec :: Type -> Type #

ToJSON TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TreemapChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TreemapChartSpec = D1 (MetaData "TreemapChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TreemapChartSpec'" PrefixI True) (((S1 (MetaSel (Just "_tcsHintedLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_tcsMaxValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_tcsHeaderColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)))) :*: (S1 (MetaSel (Just "_tcsSizeData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: (S1 (MetaSel (Just "_tcsColorData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_tcsHideTooltips") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))))) :*: ((S1 (MetaSel (Just "_tcsLevels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: (S1 (MetaSel (Just "_tcsLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)) :*: S1 (MetaSel (Just "_tcsColorScale") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TreemapChartColorScale)))) :*: (S1 (MetaSel (Just "_tcsTextFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: (S1 (MetaSel (Just "_tcsMinValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_tcsParentLabels") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData)))))))

treemapChartSpec :: TreemapChartSpec Source #

Creates a value of TreemapChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tcsHintedLevels :: Lens' TreemapChartSpec (Maybe Int32) Source #

The number of additional data levels beyond the labeled levels to be shown on the treemap chart. These levels are not interactive and are shown without their labels. Defaults to 0 if not specified.

tcsMaxValue :: Lens' TreemapChartSpec (Maybe Double) Source #

The maximum possible data value. Cells with values greater than this will have the same color as cells with this value. If not specified, defaults to the actual maximum value from color_data, or the maximum value from size_data if color_data is not specified.

tcsHeaderColor :: Lens' TreemapChartSpec (Maybe Color) Source #

The background color for header cells.

tcsSizeData :: Lens' TreemapChartSpec (Maybe ChartData) Source #

The data that determines the size of each treemap data cell. This data is expected to be numeric. The cells corresponding to non-numeric or missing data will not be rendered. If color_data is not specified, this data is used to determine data cell background colors as well.

tcsColorData :: Lens' TreemapChartSpec (Maybe ChartData) Source #

The data that determines the background color of each treemap data cell. This field is optional. If not specified, size_data is used to determine background colors. If specified, the data is expected to be numeric. color_scale will determine how the values in this data map to data cell background colors.

tcsLevels :: Lens' TreemapChartSpec (Maybe Int32) Source #

The number of data levels to show on the treemap chart. These levels are interactive and are shown with their labels. Defaults to 2 if not specified.

tcsLabels :: Lens' TreemapChartSpec (Maybe ChartData) Source #

The data that contains the treemap cell labels.

tcsColorScale :: Lens' TreemapChartSpec (Maybe TreemapChartColorScale) Source #

The color scale for data cells in the treemap chart. Data cells are assigned colors based on their color values. These color values come from color_data, or from size_data if color_data is not specified. Cells with color values less than or equal to min_value will have minValueColor as their background color. Cells with color values greater than or equal to max_value will have maxValueColor as their background color. Cells with color values between min_value and max_value will have background colors on a gradient between minValueColor and maxValueColor, the midpoint of the gradient being midValueColor. Cells with missing or non-numeric color values will have noDataColor as their background color.

tcsTextFormat :: Lens' TreemapChartSpec (Maybe TextFormat) Source #

The text format for all labels on the chart.

tcsMinValue :: Lens' TreemapChartSpec (Maybe Double) Source #

The minimum possible data value. Cells with values less than this will have the same color as cells with this value. If not specified, defaults to the actual minimum value from color_data, or the minimum value from size_data if color_data is not specified.

tcsParentLabels :: Lens' TreemapChartSpec (Maybe ChartData) Source #

The data the contains the treemap cells' parent labels.

ConditionalFormatRule

data ConditionalFormatRule Source #

A rule describing a conditional format.

See: conditionalFormatRule smart constructor.

Instances
Eq ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ConditionalFormatRule -> c ConditionalFormatRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ConditionalFormatRule #

toConstr :: ConditionalFormatRule -> Constr #

dataTypeOf :: ConditionalFormatRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ConditionalFormatRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ConditionalFormatRule) #

gmapT :: (forall b. Data b => b -> b) -> ConditionalFormatRule -> ConditionalFormatRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ConditionalFormatRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ConditionalFormatRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> ConditionalFormatRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ConditionalFormatRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ConditionalFormatRule -> m ConditionalFormatRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionalFormatRule -> m ConditionalFormatRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ConditionalFormatRule -> m ConditionalFormatRule #

Show ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ConditionalFormatRule :: Type -> Type #

ToJSON ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ConditionalFormatRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ConditionalFormatRule = D1 (MetaData "ConditionalFormatRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ConditionalFormatRule'" PrefixI True) (S1 (MetaSel (Just "_cfrBooleanRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BooleanRule)) :*: (S1 (MetaSel (Just "_cfrGradientRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GradientRule)) :*: S1 (MetaSel (Just "_cfrRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [GridRange])))))

conditionalFormatRule :: ConditionalFormatRule Source #

Creates a value of ConditionalFormatRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

cfrBooleanRule :: Lens' ConditionalFormatRule (Maybe BooleanRule) Source #

The formatting is either "on" or "off" according to the rule.

cfrGradientRule :: Lens' ConditionalFormatRule (Maybe GradientRule) Source #

The formatting will vary based on the gradients in the rule.

cfrRanges :: Lens' ConditionalFormatRule [GridRange] Source #

The ranges that are formatted if the condition is true. All the ranges must be on the same grid.

BasicChartSpec

data BasicChartSpec Source #

The specification for a basic chart. See BasicChartType for the list of charts this supports.

See: basicChartSpec smart constructor.

Instances
Eq BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartSpec -> c BasicChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartSpec #

toConstr :: BasicChartSpec -> Constr #

dataTypeOf :: BasicChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartSpec -> BasicChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartSpec -> m BasicChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpec -> m BasicChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartSpec -> m BasicChartSpec #

Show BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicChartSpec :: Type -> Type #

ToJSON BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartSpec = D1 (MetaData "BasicChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BasicChartSpec'" PrefixI True) (((S1 (MetaSel (Just "_basHeaderCount") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_basLineSmoothing") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool))) :*: (S1 (MetaSel (Just "_basInterpolateNulls") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_basStackedType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartSpecStackedType)) :*: S1 (MetaSel (Just "_basLegendPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartSpecLegendPosition))))) :*: ((S1 (MetaSel (Just "_basSeries") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BasicChartSeries])) :*: (S1 (MetaSel (Just "_basCompareMode") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartSpecCompareMode)) :*: S1 (MetaSel (Just "_basChartType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartSpecChartType)))) :*: (S1 (MetaSel (Just "_basThreeDimensional") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_basDomains") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BasicChartDomain])) :*: S1 (MetaSel (Just "_basAxis") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [BasicChartAxis])))))))

basicChartSpec :: BasicChartSpec Source #

Creates a value of BasicChartSpec with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

basHeaderCount :: Lens' BasicChartSpec (Maybe Int32) Source #

The number of rows or columns in the data that are "headers". If not set, Google Sheets will guess how many rows are headers based on the data. (Note that BasicChartAxis.title may override the axis title inferred from the header values.)

basLineSmoothing :: Lens' BasicChartSpec (Maybe Bool) Source #

Gets whether all lines should be rendered smooth or straight by default. Applies to Line charts.

basInterpolateNulls :: Lens' BasicChartSpec (Maybe Bool) Source #

If some values in a series are missing, gaps may appear in the chart (e.g, segments of lines in a line chart will be missing). To eliminate these gaps set this to true. Applies to Line, Area, and Combo charts.

basStackedType :: Lens' BasicChartSpec (Maybe BasicChartSpecStackedType) Source #

The stacked type for charts that support vertical stacking. Applies to Area, Bar, Column, Combo, and Stepped Area charts.

basSeries :: Lens' BasicChartSpec [BasicChartSeries] Source #

The data this chart is visualizing.

basCompareMode :: Lens' BasicChartSpec (Maybe BasicChartSpecCompareMode) Source #

The behavior of tooltips and data highlighting when hovering on data and chart area.

basThreeDimensional :: Lens' BasicChartSpec (Maybe Bool) Source #

True to make the chart 3D. Applies to Bar and Column charts.

basDomains :: Lens' BasicChartSpec [BasicChartDomain] Source #

The domain of data this is charting. Only a single domain is supported.

basAxis :: Lens' BasicChartSpec [BasicChartAxis] Source #

The axis on the chart.

ManualRuleGroup

data ManualRuleGroup Source #

A group name and a list of items from the source data that should be placed in the group with this name.

See: manualRuleGroup smart constructor.

Instances
Eq ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ManualRuleGroup -> c ManualRuleGroup #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ManualRuleGroup #

toConstr :: ManualRuleGroup -> Constr #

dataTypeOf :: ManualRuleGroup -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ManualRuleGroup) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ManualRuleGroup) #

gmapT :: (forall b. Data b => b -> b) -> ManualRuleGroup -> ManualRuleGroup #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ManualRuleGroup -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ManualRuleGroup -> r #

gmapQ :: (forall d. Data d => d -> u) -> ManualRuleGroup -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ManualRuleGroup -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ManualRuleGroup -> m ManualRuleGroup #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ManualRuleGroup -> m ManualRuleGroup #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ManualRuleGroup -> m ManualRuleGroup #

Show ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ManualRuleGroup :: Type -> Type #

ToJSON ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ManualRuleGroup Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ManualRuleGroup = D1 (MetaData "ManualRuleGroup" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ManualRuleGroup'" PrefixI True) (S1 (MetaSel (Just "_mrgItems") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ExtendedValue])) :*: S1 (MetaSel (Just "_mrgGroupName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ExtendedValue))))

manualRuleGroup :: ManualRuleGroup Source #

Creates a value of ManualRuleGroup with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mrgItems :: Lens' ManualRuleGroup [ExtendedValue] Source #

The items in the source data that should be placed into this group. Each item may be a string, number, or boolean. Items may appear in at most one group within a given ManualRule. Items that do not appear in any group will appear on their own.

mrgGroupName :: Lens' ManualRuleGroup (Maybe ExtendedValue) Source #

The group name, which must be a string. Each group in a given ManualRule must have a unique group name.

BatchGetValuesByDataFilterRequestMajorDimension

data BatchGetValuesByDataFilterRequestMajorDimension Source #

The major dimension that results should use. For example, if the spreadsheet data is: `A1=1,B1=2,A2=3,B2=4`, then a request that selects that range and sets `majorDimension=ROWS` will return `[[1,2],[3,4]]`, whereas a request that sets `majorDimension=COLUMNS` will return `[[1,3],[2,4]]`.

Constructors

BGVBDFRMDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

BGVBDFRMDRows

ROWS Operates on the rows of a sheet.

BGVBDFRMDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchGetValuesByDataFilterRequestMajorDimension -> c BatchGetValuesByDataFilterRequestMajorDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchGetValuesByDataFilterRequestMajorDimension #

toConstr :: BatchGetValuesByDataFilterRequestMajorDimension -> Constr #

dataTypeOf :: BatchGetValuesByDataFilterRequestMajorDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchGetValuesByDataFilterRequestMajorDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchGetValuesByDataFilterRequestMajorDimension) #

gmapT :: (forall b. Data b => b -> b) -> BatchGetValuesByDataFilterRequestMajorDimension -> BatchGetValuesByDataFilterRequestMajorDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequestMajorDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesByDataFilterRequestMajorDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequestMajorDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchGetValuesByDataFilterRequestMajorDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestMajorDimension -> m BatchGetValuesByDataFilterRequestMajorDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestMajorDimension -> m BatchGetValuesByDataFilterRequestMajorDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesByDataFilterRequestMajorDimension -> m BatchGetValuesByDataFilterRequestMajorDimension #

Ord BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Hashable BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestMajorDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep BatchGetValuesByDataFilterRequestMajorDimension = D1 (MetaData "BatchGetValuesByDataFilterRequestMajorDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BGVBDFRMDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "BGVBDFRMDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "BGVBDFRMDColumns" PrefixI False) (U1 :: Type -> Type)))

AddConditionalFormatRuleRequest

data AddConditionalFormatRuleRequest Source #

Adds a new conditional format rule at the given index. All subsequent rules' indexes are incremented.

See: addConditionalFormatRuleRequest smart constructor.

Instances
Eq AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> AddConditionalFormatRuleRequest -> c AddConditionalFormatRuleRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c AddConditionalFormatRuleRequest #

toConstr :: AddConditionalFormatRuleRequest -> Constr #

dataTypeOf :: AddConditionalFormatRuleRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c AddConditionalFormatRuleRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c AddConditionalFormatRuleRequest) #

gmapT :: (forall b. Data b => b -> b) -> AddConditionalFormatRuleRequest -> AddConditionalFormatRuleRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> AddConditionalFormatRuleRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> AddConditionalFormatRuleRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> AddConditionalFormatRuleRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> AddConditionalFormatRuleRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> AddConditionalFormatRuleRequest -> m AddConditionalFormatRuleRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> AddConditionalFormatRuleRequest -> m AddConditionalFormatRuleRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> AddConditionalFormatRuleRequest -> m AddConditionalFormatRuleRequest #

Show AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep AddConditionalFormatRuleRequest :: Type -> Type #

ToJSON AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddConditionalFormatRuleRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep AddConditionalFormatRuleRequest = D1 (MetaData "AddConditionalFormatRuleRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "AddConditionalFormatRuleRequest'" PrefixI True) (S1 (MetaSel (Just "_acfrrRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConditionalFormatRule)) :*: S1 (MetaSel (Just "_acfrrIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))))

addConditionalFormatRuleRequest :: AddConditionalFormatRuleRequest Source #

Creates a value of AddConditionalFormatRuleRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

acfrrIndex :: Lens' AddConditionalFormatRuleRequest (Maybe Int32) Source #

The zero-based index where the rule should be inserted.

DeveloperMetadata

data DeveloperMetadata Source #

Developer metadata associated with a location or object in a spreadsheet. Developer metadata may be used to associate arbitrary data with various parts of a spreadsheet and will remain associated at those locations as they move around and the spreadsheet is edited. For example, if developer metadata is associated with row 5 and another row is then subsequently inserted above row 5, that original metadata will still be associated with the row it was first associated with (what is now row 6). If the associated object is deleted its metadata is deleted too.

See: developerMetadata smart constructor.

Instances
Eq DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeveloperMetadata -> c DeveloperMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeveloperMetadata #

toConstr :: DeveloperMetadata -> Constr #

dataTypeOf :: DeveloperMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeveloperMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeveloperMetadata) #

gmapT :: (forall b. Data b => b -> b) -> DeveloperMetadata -> DeveloperMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeveloperMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeveloperMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeveloperMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeveloperMetadata -> m DeveloperMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadata -> m DeveloperMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeveloperMetadata -> m DeveloperMetadata #

Show DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeveloperMetadata :: Type -> Type #

ToJSON DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeveloperMetadata = D1 (MetaData "DeveloperMetadata" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DeveloperMetadata'" PrefixI True) ((S1 (MetaSel (Just "_dmLocation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadataLocation)) :*: S1 (MetaSel (Just "_dmMetadataId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_dmVisibility") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadataVisibility)) :*: (S1 (MetaSel (Just "_dmMetadataKey") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_dmMetadataValue") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))))

developerMetadata :: DeveloperMetadata Source #

Creates a value of DeveloperMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dmLocation :: Lens' DeveloperMetadata (Maybe DeveloperMetadataLocation) Source #

The location where the metadata is associated.

dmMetadataId :: Lens' DeveloperMetadata (Maybe Int32) Source #

The spreadsheet-scoped unique ID that identifies the metadata. IDs may be specified when metadata is created, otherwise one will be randomly generated and assigned. Must be positive.

dmVisibility :: Lens' DeveloperMetadata (Maybe DeveloperMetadataVisibility) Source #

The metadata visibility. Developer metadata must always have a visibility specified.

dmMetadataKey :: Lens' DeveloperMetadata (Maybe Text) Source #

The metadata key. There may be multiple metadata in a spreadsheet with the same key. Developer metadata must always have a key specified.

dmMetadataValue :: Lens' DeveloperMetadata (Maybe Text) Source #

Data associated with the metadata's key.

TreemapChartColorScale

data TreemapChartColorScale Source #

A color scale for a treemap chart.

See: treemapChartColorScale smart constructor.

Instances
Eq TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TreemapChartColorScale -> c TreemapChartColorScale #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TreemapChartColorScale #

toConstr :: TreemapChartColorScale -> Constr #

dataTypeOf :: TreemapChartColorScale -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TreemapChartColorScale) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TreemapChartColorScale) #

gmapT :: (forall b. Data b => b -> b) -> TreemapChartColorScale -> TreemapChartColorScale #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TreemapChartColorScale -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TreemapChartColorScale -> r #

gmapQ :: (forall d. Data d => d -> u) -> TreemapChartColorScale -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TreemapChartColorScale -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TreemapChartColorScale -> m TreemapChartColorScale #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TreemapChartColorScale -> m TreemapChartColorScale #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TreemapChartColorScale -> m TreemapChartColorScale #

Show TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TreemapChartColorScale :: Type -> Type #

ToJSON TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TreemapChartColorScale Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TreemapChartColorScale = D1 (MetaData "TreemapChartColorScale" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "TreemapChartColorScale'" PrefixI True) ((S1 (MetaSel (Just "_tccsMinValueColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_tccsNoDataColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color))) :*: (S1 (MetaSel (Just "_tccsMaxValueColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)) :*: S1 (MetaSel (Just "_tccsMidValueColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)))))

treemapChartColorScale :: TreemapChartColorScale Source #

Creates a value of TreemapChartColorScale with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tccsMinValueColor :: Lens' TreemapChartColorScale (Maybe Color) Source #

The background color for cells with a color value less than or equal to minValue. Defaults to #dc3912 if not specified.

tccsNoDataColor :: Lens' TreemapChartColorScale (Maybe Color) Source #

The background color for cells that have no color data associated with them. Defaults to #000000 if not specified.

tccsMaxValueColor :: Lens' TreemapChartColorScale (Maybe Color) Source #

The background color for cells with a color value greater than or equal to maxValue. Defaults to #109618 if not specified.

tccsMidValueColor :: Lens' TreemapChartColorScale (Maybe Color) Source #

The background color for cells with a color value at the midpoint between minValue and maxValue. Defaults to #efe6dc if not specified.

PivotTableValueLayout

data PivotTableValueLayout Source #

Whether values should be listed horizontally (as columns) or vertically (as rows).

Constructors

Horizontal

HORIZONTAL Values are laid out horizontally (as columns).

Vertical

VERTICAL Values are laid out vertically (as rows).

Instances
Enum PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> PivotTableValueLayout -> c PivotTableValueLayout #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c PivotTableValueLayout #

toConstr :: PivotTableValueLayout -> Constr #

dataTypeOf :: PivotTableValueLayout -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c PivotTableValueLayout) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c PivotTableValueLayout) #

gmapT :: (forall b. Data b => b -> b) -> PivotTableValueLayout -> PivotTableValueLayout #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> PivotTableValueLayout -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> PivotTableValueLayout -> r #

gmapQ :: (forall d. Data d => d -> u) -> PivotTableValueLayout -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> PivotTableValueLayout -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> PivotTableValueLayout -> m PivotTableValueLayout #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTableValueLayout -> m PivotTableValueLayout #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> PivotTableValueLayout -> m PivotTableValueLayout #

Ord PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep PivotTableValueLayout :: Type -> Type #

Hashable PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotTableValueLayout Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep PivotTableValueLayout = D1 (MetaData "PivotTableValueLayout" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Horizontal" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "Vertical" PrefixI False) (U1 :: Type -> Type))

DuplicateSheetResponse

data DuplicateSheetResponse Source #

The result of duplicating a sheet.

See: duplicateSheetResponse smart constructor.

Instances
Eq DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DuplicateSheetResponse -> c DuplicateSheetResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DuplicateSheetResponse #

toConstr :: DuplicateSheetResponse -> Constr #

dataTypeOf :: DuplicateSheetResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DuplicateSheetResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DuplicateSheetResponse) #

gmapT :: (forall b. Data b => b -> b) -> DuplicateSheetResponse -> DuplicateSheetResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateSheetResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DuplicateSheetResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DuplicateSheetResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DuplicateSheetResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DuplicateSheetResponse -> m DuplicateSheetResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateSheetResponse -> m DuplicateSheetResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DuplicateSheetResponse -> m DuplicateSheetResponse #

Show DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DuplicateSheetResponse :: Type -> Type #

ToJSON DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateSheetResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DuplicateSheetResponse = D1 (MetaData "DuplicateSheetResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DuplicateSheetResponse'" PrefixI True) (S1 (MetaSel (Just "_dsrProperties") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe SheetProperties))))

duplicateSheetResponse :: DuplicateSheetResponse Source #

Creates a value of DuplicateSheetResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dsrProperties :: Lens' DuplicateSheetResponse (Maybe SheetProperties) Source #

The properties of the duplicate sheet.

TextFormat

data TextFormat Source #

The format of a run of text in a cell. Absent values indicate that the field isn't specified.

See: textFormat smart constructor.

Instances
Eq TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TextFormat -> c TextFormat #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TextFormat #

toConstr :: TextFormat -> Constr #

dataTypeOf :: TextFormat -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TextFormat) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TextFormat) #

gmapT :: (forall b. Data b => b -> b) -> TextFormat -> TextFormat #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TextFormat -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TextFormat -> r #

gmapQ :: (forall d. Data d => d -> u) -> TextFormat -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TextFormat -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TextFormat -> m TextFormat #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TextFormat -> m TextFormat #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TextFormat -> m TextFormat #

Show TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep TextFormat :: Type -> Type #

ToJSON TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep TextFormat Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

textFormat :: TextFormat Source #

Creates a value of TextFormat with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

tfForegRoundColor :: Lens' TextFormat (Maybe Color) Source #

The foreground color of the text.

tfFontSize :: Lens' TextFormat (Maybe Int32) Source #

The size of the font.

tfUnderline :: Lens' TextFormat (Maybe Bool) Source #

True if the text is underlined.

tfItalic :: Lens' TextFormat (Maybe Bool) Source #

True if the text is italicized.

tfBold :: Lens' TextFormat (Maybe Bool) Source #

True if the text is bold.

tfStrikethrough :: Lens' TextFormat (Maybe Bool) Source #

True if the text has a strikethrough.

CreateDeveloperMetadataRequest

data CreateDeveloperMetadataRequest Source #

A request to create developer metadata.

See: createDeveloperMetadataRequest smart constructor.

Instances
Eq CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> CreateDeveloperMetadataRequest -> c CreateDeveloperMetadataRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c CreateDeveloperMetadataRequest #

toConstr :: CreateDeveloperMetadataRequest -> Constr #

dataTypeOf :: CreateDeveloperMetadataRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c CreateDeveloperMetadataRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c CreateDeveloperMetadataRequest) #

gmapT :: (forall b. Data b => b -> b) -> CreateDeveloperMetadataRequest -> CreateDeveloperMetadataRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> CreateDeveloperMetadataRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> CreateDeveloperMetadataRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> CreateDeveloperMetadataRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> CreateDeveloperMetadataRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> CreateDeveloperMetadataRequest -> m CreateDeveloperMetadataRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateDeveloperMetadataRequest -> m CreateDeveloperMetadataRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> CreateDeveloperMetadataRequest -> m CreateDeveloperMetadataRequest #

Show CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep CreateDeveloperMetadataRequest :: Type -> Type #

ToJSON CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CreateDeveloperMetadataRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep CreateDeveloperMetadataRequest = D1 (MetaData "CreateDeveloperMetadataRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "CreateDeveloperMetadataRequest'" PrefixI True) (S1 (MetaSel (Just "_cDeveloperMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe DeveloperMetadata))))

createDeveloperMetadataRequest :: CreateDeveloperMetadataRequest Source #

Creates a value of CreateDeveloperMetadataRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

BatchClearValuesResponse

data BatchClearValuesResponse Source #

The response when clearing a range of values in a spreadsheet.

See: batchClearValuesResponse smart constructor.

Instances
Eq BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchClearValuesResponse -> c BatchClearValuesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchClearValuesResponse #

toConstr :: BatchClearValuesResponse -> Constr #

dataTypeOf :: BatchClearValuesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchClearValuesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchClearValuesResponse) #

gmapT :: (forall b. Data b => b -> b) -> BatchClearValuesResponse -> BatchClearValuesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchClearValuesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchClearValuesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchClearValuesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchClearValuesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchClearValuesResponse -> m BatchClearValuesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchClearValuesResponse -> m BatchClearValuesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchClearValuesResponse -> m BatchClearValuesResponse #

Show BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchClearValuesResponse :: Type -> Type #

ToJSON BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchClearValuesResponse = D1 (MetaData "BatchClearValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchClearValuesResponse'" PrefixI True) (S1 (MetaSel (Just "_bcvrClearedRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [Text])) :*: S1 (MetaSel (Just "_bcvrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))

batchClearValuesResponse :: BatchClearValuesResponse Source #

Creates a value of BatchClearValuesResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bcvrClearedRanges :: Lens' BatchClearValuesResponse [Text] Source #

The ranges that were cleared, in A1 notation. (If the requests were for an unbounded range or a ranger larger than the bounds of the sheet, this will be the actual ranges that were cleared, bounded to the sheet's limits.)

bcvrSpreadsheetId :: Lens' BatchClearValuesResponse (Maybe Text) Source #

The spreadsheet the updates were applied to.

MatchedValueRange

data MatchedValueRange Source #

A value range that was matched by one or more data filers.

See: matchedValueRange smart constructor.

Instances
Eq MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MatchedValueRange -> c MatchedValueRange #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MatchedValueRange #

toConstr :: MatchedValueRange -> Constr #

dataTypeOf :: MatchedValueRange -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MatchedValueRange) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MatchedValueRange) #

gmapT :: (forall b. Data b => b -> b) -> MatchedValueRange -> MatchedValueRange #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MatchedValueRange -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MatchedValueRange -> r #

gmapQ :: (forall d. Data d => d -> u) -> MatchedValueRange -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MatchedValueRange -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MatchedValueRange -> m MatchedValueRange #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchedValueRange -> m MatchedValueRange #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchedValueRange -> m MatchedValueRange #

Show MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep MatchedValueRange :: Type -> Type #

ToJSON MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MatchedValueRange Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MatchedValueRange = D1 (MetaData "MatchedValueRange" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "MatchedValueRange'" PrefixI True) (S1 (MetaSel (Just "_mvrValueRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ValueRange)) :*: S1 (MetaSel (Just "_mvrDataFilters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilter]))))

matchedValueRange :: MatchedValueRange Source #

Creates a value of MatchedValueRange with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mvrValueRange :: Lens' MatchedValueRange (Maybe ValueRange) Source #

The values matched by the DataFilter.

mvrDataFilters :: Lens' MatchedValueRange [DataFilter] Source #

The DataFilters from the request that matched the range of values.

BasicChartDomain

data BasicChartDomain Source #

The domain of a chart. For example, if charting stock prices over time, this would be the date.

See: basicChartDomain smart constructor.

Instances
Eq BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BasicChartDomain -> c BasicChartDomain #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BasicChartDomain #

toConstr :: BasicChartDomain -> Constr #

dataTypeOf :: BasicChartDomain -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BasicChartDomain) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BasicChartDomain) #

gmapT :: (forall b. Data b => b -> b) -> BasicChartDomain -> BasicChartDomain #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartDomain -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BasicChartDomain -> r #

gmapQ :: (forall d. Data d => d -> u) -> BasicChartDomain -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BasicChartDomain -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BasicChartDomain -> m BasicChartDomain #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartDomain -> m BasicChartDomain #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BasicChartDomain -> m BasicChartDomain #

Show BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BasicChartDomain :: Type -> Type #

ToJSON BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartDomain Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BasicChartDomain = D1 (MetaData "BasicChartDomain" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BasicChartDomain'" PrefixI True) (S1 (MetaSel (Just "_bcdReversed") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_bcdDomain") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartData))))

basicChartDomain :: BasicChartDomain Source #

Creates a value of BasicChartDomain with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bcdReversed :: Lens' BasicChartDomain (Maybe Bool) Source #

True to reverse the order of the domain values (horizontal axis).

bcdDomain :: Lens' BasicChartDomain (Maybe ChartData) Source #

The data of the domain. For example, if charting stock prices over time, this is the data representing the dates.

InterpolationPointType

data InterpolationPointType Source #

How the value should be interpreted.

Constructors

IPTInterpolationPointTypeUnspecified

INTERPOLATION_POINT_TYPE_UNSPECIFIED The default value, do not use.

IPTMin

MIN The interpolation point uses the minimum value in the cells over the range of the conditional format.

IPTMax

MAX The interpolation point uses the maximum value in the cells over the range of the conditional format.

IPTNumber

NUMBER The interpolation point uses exactly the value in InterpolationPoint.value.

IPTPercent

PERCENT The interpolation point is the given percentage over all the cells in the range of the conditional format. This is equivalent to NUMBER if the value was: `=(MAX(FLATTEN(range)) * (value / 100)) + (MIN(FLATTEN(range)) * (1 - (value / 100)))` (where errors in the range are ignored when flattening).

IPTPercentile

PERCENTILE The interpolation point is the given percentile over all the cells in the range of the conditional format. This is equivalent to NUMBER if the value was: `=PERCENTILE(FLATTEN(range), value / 100)` (where errors in the range are ignored when flattening).

Instances
Enum InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InterpolationPointType -> c InterpolationPointType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InterpolationPointType #

toConstr :: InterpolationPointType -> Constr #

dataTypeOf :: InterpolationPointType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InterpolationPointType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InterpolationPointType) #

gmapT :: (forall b. Data b => b -> b) -> InterpolationPointType -> InterpolationPointType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InterpolationPointType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InterpolationPointType -> r #

gmapQ :: (forall d. Data d => d -> u) -> InterpolationPointType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InterpolationPointType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InterpolationPointType -> m InterpolationPointType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InterpolationPointType -> m InterpolationPointType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InterpolationPointType -> m InterpolationPointType #

Ord InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep InterpolationPointType :: Type -> Type #

Hashable InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep InterpolationPointType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep InterpolationPointType = D1 (MetaData "InterpolationPointType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "IPTInterpolationPointTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "IPTMin" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IPTMax" PrefixI False) (U1 :: Type -> Type))) :+: (C1 (MetaCons "IPTNumber" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "IPTPercent" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IPTPercentile" PrefixI False) (U1 :: Type -> Type))))

HistogramRule

data HistogramRule Source #

Allows you to organize the numeric values in a source data column into buckets of a constant size. All values from HistogramRule.start to HistogramRule.end are placed into groups of size HistogramRule.interval. In addition, all values below HistogramRule.start are placed in one group, and all values above HistogramRule.end are placed in another. Only HistogramRule.interval is required, though if HistogramRule.start and HistogramRule.end are both provided, HistogramRule.start must be less than HistogramRule.end. For example, a pivot table showing average purchase amount by age that has 50+ rows: +-----+-------------------+ | Age | AVERAGE of Amount | +-----+-------------------+ | 16 | $27.13 | | 17 | $5.24 | | 18 | $20.15 | ... +-----+-------------------+ could be turned into a pivot table that looks like the one below by applying a histogram group rule with a HistogramRule.start of 25, an HistogramRule.interval of 20, and an HistogramRule.end of 65. +-------------+-------------------+ | Grouped Age | AVERAGE of Amount | +-------------+-------------------+ | < 25 | $19.34 | | 25-45 | $31.43 | | 45-65 | $35.87 | | > 65 | $27.55 | +-------------+-------------------+ | Grand Total | $29.12 | +-------------+-------------------+

See: histogramRule smart constructor.

Instances
Eq HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> HistogramRule -> c HistogramRule #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c HistogramRule #

toConstr :: HistogramRule -> Constr #

dataTypeOf :: HistogramRule -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c HistogramRule) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c HistogramRule) #

gmapT :: (forall b. Data b => b -> b) -> HistogramRule -> HistogramRule #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> HistogramRule -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> HistogramRule -> r #

gmapQ :: (forall d. Data d => d -> u) -> HistogramRule -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> HistogramRule -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> HistogramRule -> m HistogramRule #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramRule -> m HistogramRule #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> HistogramRule -> m HistogramRule #

Show HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep HistogramRule :: Type -> Type #

ToJSON HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramRule Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep HistogramRule = D1 (MetaData "HistogramRule" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "HistogramRule'" PrefixI True) (S1 (MetaSel (Just "_hrStart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: (S1 (MetaSel (Just "_hrInterval") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))) :*: S1 (MetaSel (Just "_hrEnd") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Double))))))

histogramRule :: HistogramRule Source #

Creates a value of HistogramRule with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

hrStart :: Lens' HistogramRule (Maybe Double) Source #

The minimum value at which items are placed into buckets of constant size. Values below start are lumped into a single bucket. This field is optional.

hrInterval :: Lens' HistogramRule (Maybe Double) Source #

The size of the buckets that are created. Must be positive.

hrEnd :: Lens' HistogramRule (Maybe Double) Source #

The maximum value at which items are placed into buckets of constant size. Values above end are lumped into a single bucket. This field is optional.

MatchedDeveloperMetadata

data MatchedDeveloperMetadata Source #

A developer metadata entry and the data filters specified in the original request that matched it.

See: matchedDeveloperMetadata smart constructor.

Instances
Eq MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> MatchedDeveloperMetadata -> c MatchedDeveloperMetadata #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c MatchedDeveloperMetadata #

toConstr :: MatchedDeveloperMetadata -> Constr #

dataTypeOf :: MatchedDeveloperMetadata -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c MatchedDeveloperMetadata) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c MatchedDeveloperMetadata) #

gmapT :: (forall b. Data b => b -> b) -> MatchedDeveloperMetadata -> MatchedDeveloperMetadata #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> MatchedDeveloperMetadata -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> MatchedDeveloperMetadata -> r #

gmapQ :: (forall d. Data d => d -> u) -> MatchedDeveloperMetadata -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> MatchedDeveloperMetadata -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> MatchedDeveloperMetadata -> m MatchedDeveloperMetadata #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchedDeveloperMetadata -> m MatchedDeveloperMetadata #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> MatchedDeveloperMetadata -> m MatchedDeveloperMetadata #

Show MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep MatchedDeveloperMetadata :: Type -> Type #

ToJSON MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MatchedDeveloperMetadata Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep MatchedDeveloperMetadata = D1 (MetaData "MatchedDeveloperMetadata" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "MatchedDeveloperMetadata'" PrefixI True) (S1 (MetaSel (Just "_mdmDataFilters") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DataFilter])) :*: S1 (MetaSel (Just "_mdmDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeveloperMetadata))))

matchedDeveloperMetadata :: MatchedDeveloperMetadata Source #

Creates a value of MatchedDeveloperMetadata with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

mdmDataFilters :: Lens' MatchedDeveloperMetadata [DataFilter] Source #

All filters matching the returned developer metadata.

mdmDeveloperMetadata :: Lens' MatchedDeveloperMetadata (Maybe DeveloperMetadata) Source #

The developer metadata matching the specified filters.

TextToColumnsRequestDelimiterType

data TextToColumnsRequestDelimiterType Source #

The delimiter type to use.

Constructors

TTCRDTDelimiterTypeUnspecified

DELIMITER_TYPE_UNSPECIFIED Default value. This value must not be used.

TTCRDTComma

COMMA ","

TTCRDTSemicolon

SEMICOLON ";"

TTCRDTPeriod

PERIOD "."

TTCRDTSpace

SPACE " "

TTCRDTCustom

CUSTOM A custom value as defined in delimiter.

TTCRDTAutodetect

AUTODETECT Automatically detect columns.

Instances
Enum TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> TextToColumnsRequestDelimiterType -> c TextToColumnsRequestDelimiterType #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c TextToColumnsRequestDelimiterType #

toConstr :: TextToColumnsRequestDelimiterType -> Constr #

dataTypeOf :: TextToColumnsRequestDelimiterType -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c TextToColumnsRequestDelimiterType) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c TextToColumnsRequestDelimiterType) #

gmapT :: (forall b. Data b => b -> b) -> TextToColumnsRequestDelimiterType -> TextToColumnsRequestDelimiterType #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> TextToColumnsRequestDelimiterType -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> TextToColumnsRequestDelimiterType -> r #

gmapQ :: (forall d. Data d => d -> u) -> TextToColumnsRequestDelimiterType -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> TextToColumnsRequestDelimiterType -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> TextToColumnsRequestDelimiterType -> m TextToColumnsRequestDelimiterType #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> TextToColumnsRequestDelimiterType -> m TextToColumnsRequestDelimiterType #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> TextToColumnsRequestDelimiterType -> m TextToColumnsRequestDelimiterType #

Ord TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep TextToColumnsRequestDelimiterType :: Type -> Type #

Hashable TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep TextToColumnsRequestDelimiterType Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep TextToColumnsRequestDelimiterType = D1 (MetaData "TextToColumnsRequestDelimiterType" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) ((C1 (MetaCons "TTCRDTDelimiterTypeUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "TTCRDTComma" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TTCRDTSemicolon" PrefixI False) (U1 :: Type -> Type))) :+: ((C1 (MetaCons "TTCRDTPeriod" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TTCRDTSpace" PrefixI False) (U1 :: Type -> Type)) :+: (C1 (MetaCons "TTCRDTCustom" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "TTCRDTAutodetect" PrefixI False) (U1 :: Type -> Type))))

InsertRangeRequest

data InsertRangeRequest Source #

Inserts cells into a range, shifting the existing cells over or down.

See: insertRangeRequest smart constructor.

Instances
Eq InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InsertRangeRequest -> c InsertRangeRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InsertRangeRequest #

toConstr :: InsertRangeRequest -> Constr #

dataTypeOf :: InsertRangeRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InsertRangeRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InsertRangeRequest) #

gmapT :: (forall b. Data b => b -> b) -> InsertRangeRequest -> InsertRangeRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InsertRangeRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InsertRangeRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> InsertRangeRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InsertRangeRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InsertRangeRequest -> m InsertRangeRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertRangeRequest -> m InsertRangeRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertRangeRequest -> m InsertRangeRequest #

Show InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep InsertRangeRequest :: Type -> Type #

ToJSON InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InsertRangeRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep InsertRangeRequest = D1 (MetaData "InsertRangeRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "InsertRangeRequest'" PrefixI True) (S1 (MetaSel (Just "_irrShiftDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InsertRangeRequestShiftDimension)) :*: S1 (MetaSel (Just "_irrRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GridRange))))

insertRangeRequest :: InsertRangeRequest Source #

Creates a value of InsertRangeRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

irrShiftDimension :: Lens' InsertRangeRequest (Maybe InsertRangeRequestShiftDimension) Source #

The dimension which will be shifted when inserting cells. If ROWS, existing cells will be shifted down. If COLUMNS, existing cells will be shifted right.

irrRange :: Lens' InsertRangeRequest (Maybe GridRange) Source #

The range to insert new cells into.

InsertRangeRequestShiftDimension

data InsertRangeRequestShiftDimension Source #

The dimension which will be shifted when inserting cells. If ROWS, existing cells will be shifted down. If COLUMNS, existing cells will be shifted right.

Constructors

IRRSDDimensionUnspecified

DIMENSION_UNSPECIFIED The default value, do not use.

IRRSDRows

ROWS Operates on the rows of a sheet.

IRRSDColumns

COLUMNS Operates on the columns of a sheet.

Instances
Enum InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Eq InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Data InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> InsertRangeRequestShiftDimension -> c InsertRangeRequestShiftDimension #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c InsertRangeRequestShiftDimension #

toConstr :: InsertRangeRequestShiftDimension -> Constr #

dataTypeOf :: InsertRangeRequestShiftDimension -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c InsertRangeRequestShiftDimension) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c InsertRangeRequestShiftDimension) #

gmapT :: (forall b. Data b => b -> b) -> InsertRangeRequestShiftDimension -> InsertRangeRequestShiftDimension #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> InsertRangeRequestShiftDimension -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> InsertRangeRequestShiftDimension -> r #

gmapQ :: (forall d. Data d => d -> u) -> InsertRangeRequestShiftDimension -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> InsertRangeRequestShiftDimension -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> InsertRangeRequestShiftDimension -> m InsertRangeRequestShiftDimension #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertRangeRequestShiftDimension -> m InsertRangeRequestShiftDimension #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> InsertRangeRequestShiftDimension -> m InsertRangeRequestShiftDimension #

Ord InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Read InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Show InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Generic InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

Associated Types

type Rep InsertRangeRequestShiftDimension :: Type -> Type #

Hashable InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToJSON InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromJSON InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

FromHttpApiData InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

ToHttpApiData InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep InsertRangeRequestShiftDimension Source # 
Instance details

Defined in Network.Google.Sheets.Types.Sum

type Rep InsertRangeRequestShiftDimension = D1 (MetaData "InsertRangeRequestShiftDimension" "Network.Google.Sheets.Types.Sum" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "IRRSDDimensionUnspecified" PrefixI False) (U1 :: Type -> Type) :+: (C1 (MetaCons "IRRSDRows" PrefixI False) (U1 :: Type -> Type) :+: C1 (MetaCons "IRRSDColumns" PrefixI False) (U1 :: Type -> Type)))

Padding

data Padding Source #

The amount of padding around the cell, in pixels. When updating padding, every field must be specified.

See: padding smart constructor.

Instances
Eq Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

(==) :: Padding -> Padding -> Bool #

(/=) :: Padding -> Padding -> Bool #

Data Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Padding -> c Padding #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Padding #

toConstr :: Padding -> Constr #

dataTypeOf :: Padding -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Padding) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Padding) #

gmapT :: (forall b. Data b => b -> b) -> Padding -> Padding #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Padding -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Padding -> r #

gmapQ :: (forall d. Data d => d -> u) -> Padding -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Padding -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Padding -> m Padding #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Padding -> m Padding #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Padding -> m Padding #

Show Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Padding :: Type -> Type #

Methods

from :: Padding -> Rep Padding x #

to :: Rep Padding x -> Padding #

ToJSON Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Padding Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Padding = D1 (MetaData "Padding" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Padding'" PrefixI True) ((S1 (MetaSel (Just "_pBottom") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_pLeft") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_pRight") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_pTop") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))))))

padding :: Padding Source #

Creates a value of Padding with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

pBottom :: Lens' Padding (Maybe Int32) Source #

The bottom padding of the cell.

pLeft :: Lens' Padding (Maybe Int32) Source #

The left padding of the cell.

pRight :: Lens' Padding (Maybe Int32) Source #

The right padding of the cell.

pTop :: Lens' Padding (Maybe Int32) Source #

The top padding of the cell.

ChartSpec

data ChartSpec Source #

The specifications of a chart.

See: chartSpec smart constructor.

Instances
Eq ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> ChartSpec -> c ChartSpec #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c ChartSpec #

toConstr :: ChartSpec -> Constr #

dataTypeOf :: ChartSpec -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c ChartSpec) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c ChartSpec) #

gmapT :: (forall b. Data b => b -> b) -> ChartSpec -> ChartSpec #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> ChartSpec -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> ChartSpec -> r #

gmapQ :: (forall d. Data d => d -> u) -> ChartSpec -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> ChartSpec -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> ChartSpec -> m ChartSpec #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSpec -> m ChartSpec #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> ChartSpec -> m ChartSpec #

Show ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep ChartSpec :: Type -> Type #

ToJSON ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartSpec Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep ChartSpec = D1 (MetaData "ChartSpec" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "ChartSpec'" PrefixI True) ((((S1 (MetaSel (Just "_csTitleTextPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextPosition)) :*: S1 (MetaSel (Just "_csFontName") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))) :*: (S1 (MetaSel (Just "_csSubtitleTextPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextPosition)) :*: S1 (MetaSel (Just "_csBackgRoundColor") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Color)))) :*: ((S1 (MetaSel (Just "_csCandlestickChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CandlestickChartSpec)) :*: S1 (MetaSel (Just "_csWaterfallChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe WaterfallChartSpec))) :*: (S1 (MetaSel (Just "_csTitleTextFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: (S1 (MetaSel (Just "_csSubtitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_csAltText") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)))))) :*: (((S1 (MetaSel (Just "_csHistogramChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe HistogramChartSpec)) :*: S1 (MetaSel (Just "_csBubbleChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BubbleChartSpec))) :*: (S1 (MetaSel (Just "_csMaximized") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: (S1 (MetaSel (Just "_csSubtitleTextFormat") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextFormat)) :*: S1 (MetaSel (Just "_csTitle") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text))))) :*: ((S1 (MetaSel (Just "_csPieChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PieChartSpec)) :*: S1 (MetaSel (Just "_csOrgChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe OrgChartSpec))) :*: (S1 (MetaSel (Just "_csTreemapChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TreemapChartSpec)) :*: (S1 (MetaSel (Just "_csBasicChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BasicChartSpec)) :*: S1 (MetaSel (Just "_csHiddenDimensionStrategy") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ChartSpecHiddenDimensionStrategy))))))))

csTitleTextPosition :: Lens' ChartSpec (Maybe TextPosition) Source #

The title text position. This field is optional.

csFontName :: Lens' ChartSpec (Maybe Text) Source #

The name of the font to use by default for all chart text (e.g. title, axis labels, legend). If a font is specified for a specific part of the chart it will override this font name.

csSubtitleTextPosition :: Lens' ChartSpec (Maybe TextPosition) Source #

The subtitle text position. This field is optional.

csBackgRoundColor :: Lens' ChartSpec (Maybe Color) Source #

The background color of the entire chart. Not applicable to Org charts.

csCandlestickChart :: Lens' ChartSpec (Maybe CandlestickChartSpec) Source #

A candlestick chart specification.

csWaterfallChart :: Lens' ChartSpec (Maybe WaterfallChartSpec) Source #

A waterfall chart specification.

csTitleTextFormat :: Lens' ChartSpec (Maybe TextFormat) Source #

The title text format. Strikethrough and underline are not supported.

csSubtitle :: Lens' ChartSpec (Maybe Text) Source #

The subtitle of the chart.

csAltText :: Lens' ChartSpec (Maybe Text) Source #

The alternative text that describes the chart. This is often used for accessibility.

csHistogramChart :: Lens' ChartSpec (Maybe HistogramChartSpec) Source #

A histogram chart specification.

csBubbleChart :: Lens' ChartSpec (Maybe BubbleChartSpec) Source #

A bubble chart specification.

csMaximized :: Lens' ChartSpec (Maybe Bool) Source #

True to make a chart fill the entire space in which it's rendered with minimum padding. False to use the default padding. (Not applicable to Geo and Org charts.)

csSubtitleTextFormat :: Lens' ChartSpec (Maybe TextFormat) Source #

The subtitle text format. Strikethrough and underline are not supported.

csTitle :: Lens' ChartSpec (Maybe Text) Source #

The title of the chart.

csPieChart :: Lens' ChartSpec (Maybe PieChartSpec) Source #

A pie chart specification.

csOrgChart :: Lens' ChartSpec (Maybe OrgChartSpec) Source #

An org chart specification.

csTreemapChart :: Lens' ChartSpec (Maybe TreemapChartSpec) Source #

A treemap chart specification.

csBasicChart :: Lens' ChartSpec (Maybe BasicChartSpec) Source #

A basic chart specification, can be one of many kinds of charts. See BasicChartType for the list of all charts this supports.

csHiddenDimensionStrategy :: Lens' ChartSpec (Maybe ChartSpecHiddenDimensionStrategy) Source #

Determines how the charts will use hidden rows or columns.

DimensionProperties

data DimensionProperties Source #

Properties about a dimension.

See: dimensionProperties smart constructor.

Instances
Eq DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DimensionProperties -> c DimensionProperties #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DimensionProperties #

toConstr :: DimensionProperties -> Constr #

dataTypeOf :: DimensionProperties -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DimensionProperties) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DimensionProperties) #

gmapT :: (forall b. Data b => b -> b) -> DimensionProperties -> DimensionProperties #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DimensionProperties -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DimensionProperties -> r #

gmapQ :: (forall d. Data d => d -> u) -> DimensionProperties -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DimensionProperties -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DimensionProperties -> m DimensionProperties #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionProperties -> m DimensionProperties #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DimensionProperties -> m DimensionProperties #

Show DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DimensionProperties :: Type -> Type #

ToJSON DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionProperties Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DimensionProperties = D1 (MetaData "DimensionProperties" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "DimensionProperties'" PrefixI True) ((S1 (MetaSel (Just "_dpHiddenByFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dpPixelSize") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_dpHiddenByUser") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Bool)) :*: S1 (MetaSel (Just "_dpDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [DeveloperMetadata])))))

dimensionProperties :: DimensionProperties Source #

Creates a value of DimensionProperties with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dpHiddenByFilter :: Lens' DimensionProperties (Maybe Bool) Source #

True if this dimension is being filtered. This field is read-only.

dpPixelSize :: Lens' DimensionProperties (Maybe Int32) Source #

The height (if a row) or width (if a column) of the dimension in pixels.

dpHiddenByUser :: Lens' DimensionProperties (Maybe Bool) Source #

True if this dimension is explicitly hidden.

dpDeveloperMetadata :: Lens' DimensionProperties [DeveloperMetadata] Source #

The developer metadata associated with a single row or column.

UpdateBandingRequest

data UpdateBandingRequest Source #

Updates properties of the supplied banded range.

See: updateBandingRequest smart constructor.

Instances
Eq UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateBandingRequest -> c UpdateBandingRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateBandingRequest #

toConstr :: UpdateBandingRequest -> Constr #

dataTypeOf :: UpdateBandingRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateBandingRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateBandingRequest) #

gmapT :: (forall b. Data b => b -> b) -> UpdateBandingRequest -> UpdateBandingRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateBandingRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateBandingRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateBandingRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateBandingRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateBandingRequest -> m UpdateBandingRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateBandingRequest -> m UpdateBandingRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateBandingRequest -> m UpdateBandingRequest #

Show UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateBandingRequest :: Type -> Type #

ToJSON UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateBandingRequest = D1 (MetaData "UpdateBandingRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateBandingRequest'" PrefixI True) (S1 (MetaSel (Just "_ubrBandedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe BandedRange)) :*: S1 (MetaSel (Just "_ubrFields") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe GFieldMask))))

updateBandingRequest :: UpdateBandingRequest Source #

Creates a value of UpdateBandingRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

ubrBandedRange :: Lens' UpdateBandingRequest (Maybe BandedRange) Source #

The banded range to update with the new properties.

ubrFields :: Lens' UpdateBandingRequest (Maybe GFieldMask) Source #

The fields that should be updated. At least one field must be specified. The root `bandedRange` is implied and should not be specified. A single `"*"` can be used as short-hand for listing every field.

BatchGetValuesResponse

data BatchGetValuesResponse Source #

The response when retrieving more than one range of values in a spreadsheet.

See: batchGetValuesResponse smart constructor.

Instances
Eq BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> BatchGetValuesResponse -> c BatchGetValuesResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c BatchGetValuesResponse #

toConstr :: BatchGetValuesResponse -> Constr #

dataTypeOf :: BatchGetValuesResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c BatchGetValuesResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c BatchGetValuesResponse) #

gmapT :: (forall b. Data b => b -> b) -> BatchGetValuesResponse -> BatchGetValuesResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> BatchGetValuesResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> BatchGetValuesResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> BatchGetValuesResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> BatchGetValuesResponse -> m BatchGetValuesResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesResponse -> m BatchGetValuesResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> BatchGetValuesResponse -> m BatchGetValuesResponse #

Show BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep BatchGetValuesResponse :: Type -> Type #

ToJSON BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep BatchGetValuesResponse = D1 (MetaData "BatchGetValuesResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "BatchGetValuesResponse'" PrefixI True) (S1 (MetaSel (Just "_bgvrSpreadsheetId") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe Text)) :*: S1 (MetaSel (Just "_bgvrValueRanges") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe [ValueRange]))))

batchGetValuesResponse :: BatchGetValuesResponse Source #

Creates a value of BatchGetValuesResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

bgvrSpreadsheetId :: Lens' BatchGetValuesResponse (Maybe Text) Source #

The ID of the spreadsheet the data was retrieved from.

bgvrValueRanges :: Lens' BatchGetValuesResponse [ValueRange] Source #

The requested values. The order of the ValueRanges is the same as the order of the requested ranges.

DeleteBandingRequest

data DeleteBandingRequest Source #

Removes the banded range with the given ID from the spreadsheet.

See: deleteBandingRequest smart constructor.

Instances
Eq DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteBandingRequest -> c DeleteBandingRequest #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteBandingRequest #

toConstr :: DeleteBandingRequest -> Constr #

dataTypeOf :: DeleteBandingRequest -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteBandingRequest) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteBandingRequest) #

gmapT :: (forall b. Data b => b -> b) -> DeleteBandingRequest -> DeleteBandingRequest #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteBandingRequest -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteBandingRequest -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteBandingRequest -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteBandingRequest -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteBandingRequest -> m DeleteBandingRequest #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteBandingRequest -> m DeleteBandingRequest #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteBandingRequest -> m DeleteBandingRequest #

Show DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteBandingRequest :: Type -> Type #

ToJSON DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteBandingRequest Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteBandingRequest = D1 (MetaData "DeleteBandingRequest" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteBandingRequest'" PrefixI True) (S1 (MetaSel (Just "_dbrBandedRangeId") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe (Textual Int32)))))

deleteBandingRequest :: DeleteBandingRequest Source #

Creates a value of DeleteBandingRequest with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

dbrBandedRangeId :: Lens' DeleteBandingRequest (Maybe Int32) Source #

The ID of the banded range to delete.

DeleteDeveloperMetadataResponse

data DeleteDeveloperMetadataResponse Source #

The response from deleting developer metadata.

See: deleteDeveloperMetadataResponse smart constructor.

Instances
Eq DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteDeveloperMetadataResponse -> c DeleteDeveloperMetadataResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteDeveloperMetadataResponse #

toConstr :: DeleteDeveloperMetadataResponse -> Constr #

dataTypeOf :: DeleteDeveloperMetadataResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteDeveloperMetadataResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteDeveloperMetadataResponse) #

gmapT :: (forall b. Data b => b -> b) -> DeleteDeveloperMetadataResponse -> DeleteDeveloperMetadataResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDeveloperMetadataResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteDeveloperMetadataResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteDeveloperMetadataResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteDeveloperMetadataResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataResponse -> m DeleteDeveloperMetadataResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataResponse -> m DeleteDeveloperMetadataResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteDeveloperMetadataResponse -> m DeleteDeveloperMetadataResponse #

Show DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep DeleteDeveloperMetadataResponse :: Type -> Type #

ToJSON DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteDeveloperMetadataResponse = D1 (MetaData "DeleteDeveloperMetadataResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteDeveloperMetadataResponse'" PrefixI True) (S1 (MetaSel (Just "_ddmrDeletedDeveloperMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DeveloperMetadata]))))

deleteDeveloperMetadataResponse :: DeleteDeveloperMetadataResponse Source #

Creates a value of DeleteDeveloperMetadataResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

UpdateDeveloperMetadataResponse

data UpdateDeveloperMetadataResponse Source #

The response from updating developer metadata.

See: updateDeveloperMetadataResponse smart constructor.

Instances
Eq UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateDeveloperMetadataResponse -> c UpdateDeveloperMetadataResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateDeveloperMetadataResponse #

toConstr :: UpdateDeveloperMetadataResponse -> Constr #

dataTypeOf :: UpdateDeveloperMetadataResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateDeveloperMetadataResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateDeveloperMetadataResponse) #

gmapT :: (forall b. Data b => b -> b) -> UpdateDeveloperMetadataResponse -> UpdateDeveloperMetadataResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDeveloperMetadataResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateDeveloperMetadataResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateDeveloperMetadataResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateDeveloperMetadataResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataResponse -> m UpdateDeveloperMetadataResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataResponse -> m UpdateDeveloperMetadataResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateDeveloperMetadataResponse -> m UpdateDeveloperMetadataResponse #

Show UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep UpdateDeveloperMetadataResponse :: Type -> Type #

ToJSON UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDeveloperMetadataResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateDeveloperMetadataResponse = D1 (MetaData "UpdateDeveloperMetadataResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "UpdateDeveloperMetadataResponse'" PrefixI True) (S1 (MetaSel (Just "_uDeveloperMetadata") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe [DeveloperMetadata]))))

updateDeveloperMetadataResponse :: UpdateDeveloperMetadataResponse Source #

Creates a value of UpdateDeveloperMetadataResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

Request'

data Request' Source #

A single kind of update to apply to a spreadsheet.

See: request' smart constructor.

Instances
Eq Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Request' -> c Request' #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Request' #

toConstr :: Request' -> Constr #

dataTypeOf :: Request' -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Request') #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Request') #

gmapT :: (forall b. Data b => b -> b) -> Request' -> Request' #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Request' -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Request' -> r #

gmapQ :: (forall d. Data d => d -> u) -> Request' -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Request' -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Request' -> m Request' #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Request' -> m Request' #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Request' -> m Request' #

Show Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep Request' :: Type -> Type #

Methods

from :: Request' -> Rep Request' x #

to :: Rep Request' x -> Request' #

ToJSON Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Request' Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep Request' = D1 (MetaData "Request'" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "Request''" PrefixI True) (((((S1 (MetaSel (Just "_reqAddFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddFilterViewRequest)) :*: (S1 (MetaSel (Just "_reqDeleteProtectedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteProtectedRangeRequest)) :*: S1 (MetaSel (Just "_reqUpdateProtectedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateProtectedRangeRequest)))) :*: ((S1 (MetaSel (Just "_reqUpdateCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateCellsRequest)) :*: S1 (MetaSel (Just "_reqCreateDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CreateDeveloperMetadataRequest))) :*: (S1 (MetaSel (Just "_reqDuplicateFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DuplicateFilterViewRequest)) :*: S1 (MetaSel (Just "_reqAddConditionalFormatRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddConditionalFormatRuleRequest))))) :*: ((S1 (MetaSel (Just "_reqRandomizeRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RandomizeRangeRequest)) :*: (S1 (MetaSel (Just "_reqSortRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SortRangeRequest)) :*: S1 (MetaSel (Just "_reqUpdateNamedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateNamedRangeRequest)))) :*: ((S1 (MetaSel (Just "_reqDeleteNamedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteNamedRangeRequest)) :*: S1 (MetaSel (Just "_reqInsertRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InsertRangeRequest))) :*: (S1 (MetaSel (Just "_reqDeleteBanding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteBandingRequest)) :*: S1 (MetaSel (Just "_reqUpdateBanding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateBandingRequest)))))) :*: (((S1 (MetaSel (Just "_reqClearBasicFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ClearBasicFilterRequest)) :*: (S1 (MetaSel (Just "_reqAppendCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AppendCellsRequest)) :*: S1 (MetaSel (Just "_reqPasteData") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe PasteDataRequest)))) :*: ((S1 (MetaSel (Just "_reqUpdateEmbeddedObjectPosition") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateEmbeddedObjectPositionRequest)) :*: S1 (MetaSel (Just "_reqDeleteRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteRangeRequest))) :*: (S1 (MetaSel (Just "_reqCopyPaste") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CopyPasteRequest)) :*: S1 (MetaSel (Just "_reqUpdateDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateDimensionGroupRequest))))) :*: ((S1 (MetaSel (Just "_reqDeleteDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteDimensionGroupRequest)) :*: (S1 (MetaSel (Just "_reqAutoResizeDimensions") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AutoResizeDimensionsRequest)) :*: S1 (MetaSel (Just "_reqAddSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddSheetRequest)))) :*: ((S1 (MetaSel (Just "_reqFindReplace") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe FindReplaceRequest)) :*: S1 (MetaSel (Just "_reqDeleteDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteDimensionRequest))) :*: (S1 (MetaSel (Just "_reqCutPaste") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe CutPasteRequest)) :*: S1 (MetaSel (Just "_reqMoveDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MoveDimensionRequest))))))) :*: ((((S1 (MetaSel (Just "_reqRepeatCell") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe RepeatCellRequest)) :*: (S1 (MetaSel (Just "_reqAddProtectedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddProtectedRangeRequest)) :*: S1 (MetaSel (Just "_reqUpdateFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateFilterViewRequest)))) :*: ((S1 (MetaSel (Just "_reqDeleteFilterView") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteFilterViewRequest)) :*: S1 (MetaSel (Just "_reqInsertDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe InsertDimensionRequest))) :*: (S1 (MetaSel (Just "_reqUpdateSheetProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateSheetPropertiesRequest)) :*: S1 (MetaSel (Just "_reqDeleteConditionalFormatRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteConditionalFormatRuleRequest))))) :*: ((S1 (MetaSel (Just "_reqUpdateConditionalFormatRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateConditionalFormatRuleRequest)) :*: (S1 (MetaSel (Just "_reqDeleteEmbeddedObject") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteEmbeddedObjectRequest)) :*: S1 (MetaSel (Just "_reqDeleteDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteDeveloperMetadataRequest)))) :*: ((S1 (MetaSel (Just "_reqUpdateDeveloperMetadata") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateDeveloperMetadataRequest)) :*: S1 (MetaSel (Just "_reqMergeCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe MergeCellsRequest))) :*: (S1 (MetaSel (Just "_reqAddNamedRange") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddNamedRangeRequest)) :*: S1 (MetaSel (Just "_reqAddChart") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddChartRequest)))))) :*: (((S1 (MetaSel (Just "_reqAddBanding") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddBandingRequest)) :*: (S1 (MetaSel (Just "_reqDuplicateSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DuplicateSheetRequest)) :*: S1 (MetaSel (Just "_reqAutoFill") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AutoFillRequest)))) :*: ((S1 (MetaSel (Just "_reqUpdateDimensionProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateDimensionPropertiesRequest)) :*: S1 (MetaSel (Just "_reqUpdateChartSpec") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateChartSpecRequest))) :*: (S1 (MetaSel (Just "_reqSetBasicFilter") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SetBasicFilterRequest)) :*: S1 (MetaSel (Just "_reqTextToColumns") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe TextToColumnsRequest))))) :*: ((S1 (MetaSel (Just "_reqAddDimensionGroup") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AddDimensionGroupRequest)) :*: (S1 (MetaSel (Just "_reqUpdateSpreadsheetProperties") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateSpreadsheetPropertiesRequest)) :*: S1 (MetaSel (Just "_reqDeleteSheet") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe DeleteSheetRequest)))) :*: ((S1 (MetaSel (Just "_reqUnmergeCells") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UnmergeCellsRequest)) :*: S1 (MetaSel (Just "_reqUpdateBOrders") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe UpdateBOrdersRequest))) :*: (S1 (MetaSel (Just "_reqAppendDimension") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe AppendDimensionRequest)) :*: S1 (MetaSel (Just "_reqSetDataValidation") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe SetDataValidationRequest)))))))))

reqUpdateCells :: Lens' Request' (Maybe UpdateCellsRequest) Source #

Updates many cells at once.

reqRandomizeRange :: Lens' Request' (Maybe RandomizeRangeRequest) Source #

Randomizes the order of the rows in a range.

reqInsertRange :: Lens' Request' (Maybe InsertRangeRequest) Source #

Inserts new cells in a sheet, shifting the existing cells.

reqClearBasicFilter :: Lens' Request' (Maybe ClearBasicFilterRequest) Source #

Clears the basic filter on a sheet.

reqAppendCells :: Lens' Request' (Maybe AppendCellsRequest) Source #

Appends cells after the last row with data in a sheet.

reqPasteData :: Lens' Request' (Maybe PasteDataRequest) Source #

Pastes data (HTML or delimited) into a sheet.

reqUpdateEmbeddedObjectPosition :: Lens' Request' (Maybe UpdateEmbeddedObjectPositionRequest) Source #

Updates an embedded object's (e.g. chart, image) position.

reqDeleteRange :: Lens' Request' (Maybe DeleteRangeRequest) Source #

Deletes a range of cells from a sheet, shifting the remaining cells.

reqCopyPaste :: Lens' Request' (Maybe CopyPasteRequest) Source #

Copies data from one area and pastes it to another.

reqUpdateDimensionGroup :: Lens' Request' (Maybe UpdateDimensionGroupRequest) Source #

Updates the state of the specified group.

reqDeleteDimensionGroup :: Lens' Request' (Maybe DeleteDimensionGroupRequest) Source #

Deletes a group over the specified range.

reqAutoResizeDimensions :: Lens' Request' (Maybe AutoResizeDimensionsRequest) Source #

Automatically resizes one or more dimensions based on the contents of the cells in that dimension.

reqFindReplace :: Lens' Request' (Maybe FindReplaceRequest) Source #

Finds and replaces occurrences of some text with other text.

reqDeleteDimension :: Lens' Request' (Maybe DeleteDimensionRequest) Source #

Deletes rows or columns in a sheet.

reqCutPaste :: Lens' Request' (Maybe CutPasteRequest) Source #

Cuts data from one area and pastes it to another.

reqMoveDimension :: Lens' Request' (Maybe MoveDimensionRequest) Source #

Moves rows or columns to another location in a sheet.

reqRepeatCell :: Lens' Request' (Maybe RepeatCellRequest) Source #

Repeats a single cell across a range.

reqUpdateFilterView :: Lens' Request' (Maybe UpdateFilterViewRequest) Source #

Updates the properties of a filter view.

reqDeleteFilterView :: Lens' Request' (Maybe DeleteFilterViewRequest) Source #

Deletes a filter view from a sheet.

reqInsertDimension :: Lens' Request' (Maybe InsertDimensionRequest) Source #

Inserts new rows or columns in a sheet.

reqDeleteEmbeddedObject :: Lens' Request' (Maybe DeleteEmbeddedObjectRequest) Source #

Deletes an embedded object (e.g, chart, image) in a sheet.

reqUpdateDeveloperMetadata :: Lens' Request' (Maybe UpdateDeveloperMetadataRequest) Source #

Updates an existing developer metadata entry

reqAutoFill :: Lens' Request' (Maybe AutoFillRequest) Source #

Automatically fills in more data based on existing data.

reqUpdateChartSpec :: Lens' Request' (Maybe UpdateChartSpecRequest) Source #

Updates a chart's specifications.

reqSetBasicFilter :: Lens' Request' (Maybe SetBasicFilterRequest) Source #

Sets the basic filter on a sheet.

reqTextToColumns :: Lens' Request' (Maybe TextToColumnsRequest) Source #

Converts a column of text into many columns of text.

reqAddDimensionGroup :: Lens' Request' (Maybe AddDimensionGroupRequest) Source #

Creates a group over the specified range.

reqUpdateBOrders :: Lens' Request' (Maybe UpdateBOrdersRequest) Source #

Updates the borders in a range of cells.

reqAppendDimension :: Lens' Request' (Maybe AppendDimensionRequest) Source #

Appends dimensions to the end of a sheet.

reqSetDataValidation :: Lens' Request' (Maybe SetDataValidationRequest) Source #

Sets data validation for one or more cells.

LineStyle

data LineStyle Source #

Properties that describe the style of a line.

See: lineStyle smart constructor.

Instances
Eq LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

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 # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Associated Types

type Rep LineStyle :: Type -> Type #

ToJSON LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep LineStyle Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep LineStyle = D1 (MetaData "LineStyle" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "LineStyle'" PrefixI True) (S1 (MetaSel (Just "_lsWidth") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_lsType") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe LineStyleType))))

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:

lsWidth :: Lens' LineStyle (Maybe Int32) Source #

The thickness of the line, in px.

lsType :: Lens' LineStyle (Maybe LineStyleType) Source #

The dash type of the line.

DeleteConditionalFormatRuleResponse

data DeleteConditionalFormatRuleResponse Source #

The result of deleting a conditional format rule.

See: deleteConditionalFormatRuleResponse smart constructor.

Instances
Eq DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> DeleteConditionalFormatRuleResponse -> c DeleteConditionalFormatRuleResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c DeleteConditionalFormatRuleResponse #

toConstr :: DeleteConditionalFormatRuleResponse -> Constr #

dataTypeOf :: DeleteConditionalFormatRuleResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c DeleteConditionalFormatRuleResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c DeleteConditionalFormatRuleResponse) #

gmapT :: (forall b. Data b => b -> b) -> DeleteConditionalFormatRuleResponse -> DeleteConditionalFormatRuleResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> DeleteConditionalFormatRuleResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> DeleteConditionalFormatRuleResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> DeleteConditionalFormatRuleResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> DeleteConditionalFormatRuleResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleResponse -> m DeleteConditionalFormatRuleResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleResponse -> m DeleteConditionalFormatRuleResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> DeleteConditionalFormatRuleResponse -> m DeleteConditionalFormatRuleResponse #

Show DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep DeleteConditionalFormatRuleResponse = D1 (MetaData "DeleteConditionalFormatRuleResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" True) (C1 (MetaCons "DeleteConditionalFormatRuleResponse'" PrefixI True) (S1 (MetaSel (Just "_dcfrrRule") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 (Maybe ConditionalFormatRule))))

deleteConditionalFormatRuleResponse :: DeleteConditionalFormatRuleResponse Source #

Creates a value of DeleteConditionalFormatRuleResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

UpdateConditionalFormatRuleResponse

data UpdateConditionalFormatRuleResponse Source #

The result of updating a conditional format rule.

See: updateConditionalFormatRuleResponse smart constructor.

Instances
Eq UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Data UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> UpdateConditionalFormatRuleResponse -> c UpdateConditionalFormatRuleResponse #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c UpdateConditionalFormatRuleResponse #

toConstr :: UpdateConditionalFormatRuleResponse -> Constr #

dataTypeOf :: UpdateConditionalFormatRuleResponse -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c UpdateConditionalFormatRuleResponse) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c UpdateConditionalFormatRuleResponse) #

gmapT :: (forall b. Data b => b -> b) -> UpdateConditionalFormatRuleResponse -> UpdateConditionalFormatRuleResponse #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> UpdateConditionalFormatRuleResponse -> r #

gmapQr :: (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> UpdateConditionalFormatRuleResponse -> r #

gmapQ :: (forall d. Data d => d -> u) -> UpdateConditionalFormatRuleResponse -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> UpdateConditionalFormatRuleResponse -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleResponse -> m UpdateConditionalFormatRuleResponse #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleResponse -> m UpdateConditionalFormatRuleResponse #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> UpdateConditionalFormatRuleResponse -> m UpdateConditionalFormatRuleResponse #

Show UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

Generic UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

ToJSON UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

FromJSON UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateConditionalFormatRuleResponse Source # 
Instance details

Defined in Network.Google.Sheets.Types.Product

type Rep UpdateConditionalFormatRuleResponse = D1 (MetaData "UpdateConditionalFormatRuleResponse" "Network.Google.Sheets.Types.Product" "gogol-sheets-0.4.0-DWkMVDpj7ZbHiXYeCjugGu" False) (C1 (MetaCons "UpdateConditionalFormatRuleResponse'" PrefixI True) ((S1 (MetaSel (Just "_uNewRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConditionalFormatRule)) :*: S1 (MetaSel (Just "_uNewIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32)))) :*: (S1 (MetaSel (Just "_uOldIndex") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe (Textual Int32))) :*: S1 (MetaSel (Just "_uOldRule") NoSourceUnpackedness SourceStrict DecidedStrict) (Rec0 (Maybe ConditionalFormatRule)))))

updateConditionalFormatRuleResponse :: UpdateConditionalFormatRuleResponse Source #

Creates a value of UpdateConditionalFormatRuleResponse with the minimum fields required to make a request.

Use one of the following lenses to modify other fields as desired:

uNewRule :: Lens' UpdateConditionalFormatRuleResponse (Maybe ConditionalFormatRule) Source #

The new rule that replaced the old rule (if replacing), or the rule that was moved (if moved)

uOldIndex :: Lens' UpdateConditionalFormatRuleResponse (Maybe Int32) Source #

The old index of the rule. Not set if a rule was replaced (because it is the same as new_index).

uOldRule :: Lens' UpdateConditionalFormatRuleResponse (Maybe ConditionalFormatRule) Source #

The old (deleted) rule. Not set if a rule was moved (because it is the same as new_rule).