napkin-backend-bigquery-2.0.0
Safe HaskellNone
LanguageGHC2024

Napkin.Types.BigQuery

Synopsis

Documentation

data BigQuery #

Instances

Instances details
Data BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BigQuery -> Constr #

dataTypeOf :: BigQuery -> DataType #

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

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

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

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

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

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

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

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

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

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

Backend BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

Methods

backendConnectionString :: BackendConn BigQuery -> ConnectionString #

backendExecute :: (MonadNapkin BigQuery m, RenderSql command BigQuery) => BackendConn BigQuery -> command -> m () #

backendQuery :: (MonadNapkin BigQuery m, RenderSql q BigQuery) => BackendConn BigQuery -> q -> m [Map Text Value] #

backendCheckTableExists :: MonadNapkin BigQuery m => BackendConn BigQuery -> Ref Table -> m Bool #

backendGetTableKind :: MonadNapkin BigQuery m => BackendConn BigQuery -> Ref Table -> m TableKind #

backendGetRelationSchema :: MonadNapkin BigQuery m => BackendConn BigQuery -> Ref Table -> Relation -> m [BackendSchemaField BigQuery] #

backendGetAnnotations :: MonadNapkin BigQuery m => BackendConn BigQuery -> Ref Table -> m TableAnnotations #

backendAnnotate :: MonadNapkin BigQuery m => BackendConn BigQuery -> Ref Table -> Annotation -> m () #

backendCreateAs :: (command ~ CreateRelation BigQuery, RenderSql command BigQuery, MonadNapkin BigQuery m) => BackendConn BigQuery -> command -> m () #

backendCreate :: (command ~ CreateTableSchema BigQuery, RenderSql command BigQuery, MonadNapkin BigQuery m) => BackendConn BigQuery -> command -> m () #

backendCopyTable :: (MonadNapkin BigQuery m, RenderSql DeleteRows BigQuery, RenderSql InsertInto BigQuery, RenderSql (CreateRelation BigQuery) BigQuery, Default (BackendMeta 'KindTable BigQuery)) => BackendConn BigQuery -> Ref Table -> Ref Table -> TableWriteStrategy -> m () #

backendDrop :: MonadNapkin BigQuery m => BackendConn BigQuery -> DropRelation -> m () #

backendInsertInto :: (command ~ InsertInto, RenderSql command BigQuery, MonadNapkin BigQuery m) => BackendConn BigQuery -> command -> m () #

backendRename :: MonadNapkin BigQuery m => BackendConn BigQuery -> RenameRelation -> m () #

backendListTables :: MonadNapkin BigQuery m => BackendConn BigQuery -> ListTables -> m (Set ListedTable) #

backendNormalize :: MonadNapkin BigQuery m => BackendConn BigQuery -> NormalizeTableNames -> m (Map (Ref Table) NormalizedTable) #

RunBackendEffect BigQuery # 
Instance details

Defined in Napkin.Run.Effects.Interpreters.Backend.BigQuery

RunBackendConn BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

BackendName BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

backendName :: Text #

NapkinParserDialect BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

BackendOperators BigQuery # 
Instance details

Defined in Napkin.Revert.BigQuery

CSVImport BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

HasBackendSchemaField BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

HasBackendQueryStats BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

SqlConcat BigQuery # 
Instance details

Defined in Napkin.Untyped.Ops.Portable.BigQuery

Methods

concat :: [SExp] -> SExp #

RenderSql Merge BigQuery # 
Instance details

Defined in Napkin.Render.BigQuery.Merge

Methods

renderSql :: Proxy BigQuery -> Merge -> ME Doc #

SimpleTypeName BigQuery 'TyBigInt # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyBlob # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyBool # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyChar # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyDate # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyDatetime # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyDecimal # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyDouble # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyInteger # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyReal # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TySmallInt # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyTimestamp # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

SimpleTypeName BigQuery 'TyVarChar # 
Instance details

Defined in Napkin.Revert.BigQuery

Methods

simpleName :: String #

ToDumpItem BigQuery BigQueryExtra # 
Instance details

Defined in Napkin.Run.Effects.Interpreters.Backend.BigQuery

Methods

toDumpItem :: forall (r :: EffectRow) x. BigQueryExtra (Sem r) x -> DumpItem BigQuery #

RenderSql (CreateRelation BigQuery) BigQuery # 
Instance details

Defined in Napkin.Render.BigQuery

FromJSON (YamlBackendMaterializedViewMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

FromJSON (YamlBackendTableMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

FromJSON (YamlBackendViewMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

FromJSON (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

Default (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

Generic (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

Show (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

Eq (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

MaybeDefault (YamlBackendMaterializedViewMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

MaybeDefault (YamlBackendTableMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

MaybeDefault (YamlBackendViewMeta BigQuery) # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

ToJSON (BackendQueryStats BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Monoid (BackendQueryStats BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Semigroup (BackendQueryStats BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Show (BackendSchemaField BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Show (BackendQueryStats BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Eq (BackendSchemaField BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

Eq (BackendQueryStats BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery

data BackendConn BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

data BackendSpecificEffect BigQuery m a # 
Instance details

Defined in Napkin.Run.Effects.Languages.Backend.BigQuery

type BackendMaterializedViewMeta BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

type BackendTableMeta BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

type BackendViewMeta BigQuery # 
Instance details

Defined in Napkin.Types.BigQuery

data DbBackendOptions BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery.Types

data BackendSchemaField BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

data BackendQueryStats BigQuery # 
Instance details

Defined in Napkin.Run.BigQuery

type Rep (DbBackendOptions BigQuery) # 
Instance details

Defined in Napkin.Run.BigQuery.Types

data BigQueryType #

Instances

Instances details
Data BigQueryType # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BigQueryType -> Constr #

dataTypeOf :: BigQueryType -> DataType #

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

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

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

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

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

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

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

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

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

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

Show BigQueryType # 
Instance details

Defined in Napkin.Types.BigQuery

Eq BigQueryType # 
Instance details

Defined in Napkin.Types.BigQuery

Ord BigQueryType # 
Instance details

Defined in Napkin.Types.BigQuery

data TableMeta #

Instances

Instances details
Default TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

def :: TableMeta #

Data TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: TableMeta -> Constr #

dataTypeOf :: TableMeta -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep TableMeta 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TableMeta = D1 ('MetaData "TableMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "TableMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "partitioning") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TablePartitioning)) :*: (S1 ('MetaSel ('Just "clustering") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Clustering)) :*: S1 ('MetaSel ('Just "writeDisposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WriteDisposition)))))
Show TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Eq TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TableMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TableMeta = D1 ('MetaData "TableMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "TableMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "partitioning") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TablePartitioning)) :*: (S1 ('MetaSel ('Just "clustering") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Clustering)) :*: S1 ('MetaSel ('Just "writeDisposition") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe WriteDisposition)))))

data PartitionInterval #

Instances

Instances details
FromJSON PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

ToJSON PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Data PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: PartitionInterval -> Constr #

dataTypeOf :: PartitionInterval -> DataType #

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

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

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

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

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

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

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

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

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

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

Bounded PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Enum PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Generic PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep PartitionInterval 
Instance details

Defined in Napkin.Types.BigQuery

type Rep PartitionInterval = D1 ('MetaData "PartitionInterval" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) ((C1 ('MetaCons "PartitionInterval_Day" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PartitionInterval_Hour" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PartitionInterval_Month" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PartitionInterval_Year" 'PrefixI 'False) (U1 :: Type -> Type)))
Show PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

Eq PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

AsJSONKey PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep PartitionInterval # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep PartitionInterval = D1 ('MetaData "PartitionInterval" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) ((C1 ('MetaCons "PartitionInterval_Day" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PartitionInterval_Hour" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "PartitionInterval_Month" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "PartitionInterval_Year" 'PrefixI 'False) (U1 :: Type -> Type)))

data TablePartitioning #

Instances

Instances details
FromJSON TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Data TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: TablePartitioning -> Constr #

dataTypeOf :: TablePartitioning -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Show TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Eq TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TablePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

data TimePartitioning #

Instances

Instances details
Default TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Data TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: TimePartitioning -> Constr #

dataTypeOf :: TimePartitioning -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep TimePartitioning 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TimePartitioning = D1 ('MetaData "TimePartitioning" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "TimePartitioning" 'PrefixI 'True) (S1 ('MetaSel ('Just "timeInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PartitionInterval) :*: (S1 ('MetaSel ('Just "expiration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NominalDiffTime)) :*: S1 ('MetaSel ('Just "requireFilter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))
Show TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

Eq TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TimePartitioning # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep TimePartitioning = D1 ('MetaData "TimePartitioning" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "TimePartitioning" 'PrefixI 'True) (S1 ('MetaSel ('Just "timeInterval") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PartitionInterval) :*: (S1 ('MetaSel ('Just "expiration") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe NominalDiffTime)) :*: S1 ('MetaSel ('Just "requireFilter") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool))))

data WriteDisposition #

Instances

Instances details
FromJSON WriteDisposition # 
Instance details

Defined in Napkin.Spec.Yaml.Types.BackendMeta.BigQuery

Data WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: WriteDisposition -> Constr #

dataTypeOf :: WriteDisposition -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep WriteDisposition 
Instance details

Defined in Napkin.Types.BigQuery

type Rep WriteDisposition = D1 ('MetaData "WriteDisposition" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "WriteEmpty" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WriteAppend" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WriteTruncate" 'PrefixI 'False) (U1 :: Type -> Type)))
Show WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

Eq WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

Ord WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep WriteDisposition # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep WriteDisposition = D1 ('MetaData "WriteDisposition" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "WriteEmpty" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "WriteAppend" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "WriteTruncate" 'PrefixI 'False) (U1 :: Type -> Type)))

data ViewMeta #

Instances

Instances details
FromJSON ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Default ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

def :: ViewMeta #

Data ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: ViewMeta -> Constr #

dataTypeOf :: ViewMeta -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep ViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

type Rep ViewMeta = D1 ('MetaData "ViewMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "ViewMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "expirationTimestamp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "authorizedDatasets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Set BQDataSetReference)))))

Methods

from :: ViewMeta -> Rep ViewMeta x #

to :: Rep ViewMeta x -> ViewMeta #

Show ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Eq ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep ViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep ViewMeta = D1 ('MetaData "ViewMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "ViewMeta" 'PrefixI 'True) (S1 ('MetaSel ('Just "expirationTimestamp") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe UTCTime)) :*: S1 ('MetaSel ('Just "authorizedDatasets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Set BQDataSetReference)))))

data MaterializedViewMeta #

Instances

Instances details
FromJSON MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Default MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Generic MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep MaterializedViewMeta 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewMeta = D1 ('MetaData "MaterializedViewMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "MaterializedViewMeta" 'PrefixI 'True) ((S1 ('MetaSel ('Just "partitioning") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TablePartitioning)) :*: S1 ('MetaSel ('Just "clustering") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Clustering))) :*: (S1 ('MetaSel ('Just "refresh") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe MaterializedViewRefresh)) :*: S1 ('MetaSel ('Just "authorizedDatasets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Set BQDataSetReference))))))
Show MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

Eq MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewMeta # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewMeta = D1 ('MetaData "MaterializedViewMeta" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "MaterializedViewMeta" 'PrefixI 'True) ((S1 ('MetaSel ('Just "partitioning") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe TablePartitioning)) :*: S1 ('MetaSel ('Just "clustering") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe Clustering))) :*: (S1 ('MetaSel ('Just "refresh") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe MaterializedViewRefresh)) :*: S1 ('MetaSel ('Just "authorizedDatasets") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe (Set BQDataSetReference))))))

data RangeWithStep #

Constructors

RangeWithStep 

Fields

Instances

Instances details
FromJSON RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

Data RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: RangeWithStep -> Constr #

dataTypeOf :: RangeWithStep -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep RangeWithStep 
Instance details

Defined in Napkin.Types.BigQuery

type Rep RangeWithStep = D1 ('MetaData "RangeWithStep" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "RangeWithStep" 'PrefixI 'True) (S1 ('MetaSel ('Just "start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64) :*: (S1 ('MetaSel ('Just "end") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64) :*: S1 ('MetaSel ('Just "step") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64))))
Show RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

Eq RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep RangeWithStep # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep RangeWithStep = D1 ('MetaData "RangeWithStep" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "RangeWithStep" 'PrefixI 'True) (S1 ('MetaSel ('Just "start") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64) :*: (S1 ('MetaSel ('Just "end") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64) :*: S1 ('MetaSel ('Just "step") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64))))

data MaterializedViewRefresh #

Constructors

Automatic 

Fields

Manual 

Instances

Instances details
FromJSON MaterializedViewRefresh # 
Instance details

Defined in Napkin.Types.BigQuery

Generic MaterializedViewRefresh # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep MaterializedViewRefresh 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewRefresh = D1 ('MetaData "MaterializedViewRefresh" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "Automatic" 'PrefixI 'True) (S1 ('MetaSel ('Just "minutes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: C1 ('MetaCons "Manual" 'PrefixI 'False) (U1 :: Type -> Type))
Show MaterializedViewRefresh # 
Instance details

Defined in Napkin.Types.BigQuery

Eq MaterializedViewRefresh # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewRefresh # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep MaterializedViewRefresh = D1 ('MetaData "MaterializedViewRefresh" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "Automatic" 'PrefixI 'True) (S1 ('MetaSel ('Just "minutes") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: C1 ('MetaCons "Manual" 'PrefixI 'False) (U1 :: Type -> Type))

refComponents :: forall {k} (a :: k). Ref a -> (Name, Name, Name) #

Deconstruct a Ref into project, dataset, and table name components.

componentsRef :: forall {k} (a :: k). (Name, Name, Name) -> Ref a #

newtype BQProjectId #

Constructors

BQProjectId Text 

Instances

Instances details
FromJSON BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Buildable BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

build :: BQProjectId -> Builder #

Data BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BQProjectId -> Constr #

dataTypeOf :: BQProjectId -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep BQProjectId 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQProjectId = D1 ('MetaData "BQProjectId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQProjectId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Show BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

Ord BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQProjectId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQProjectId = D1 ('MetaData "BQProjectId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQProjectId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype BQDataSetId #

Constructors

BQDataSetId Text 

Instances

Instances details
FromJSON BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Buildable BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

build :: BQDataSetId -> Builder #

Data BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BQDataSetId -> Constr #

dataTypeOf :: BQDataSetId -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep BQDataSetId 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetId = D1 ('MetaData "BQDataSetId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQDataSetId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Show BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

Ord BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetId = D1 ('MetaData "BQDataSetId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQDataSetId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

newtype BQTableId #

Constructors

BQTableId Text 

Instances

Instances details
Buildable BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

build :: BQTableId -> Builder #

Data BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BQTableId -> Constr #

dataTypeOf :: BQTableId -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep BQTableId 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQTableId = D1 ('MetaData "BQTableId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQTableId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))
Show BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

Ord BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQTableId # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQTableId = D1 ('MetaData "BQTableId" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'True) (C1 ('MetaCons "BQTableId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

data BQDataSetReference #

Instances

Instances details
FromJSON BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

Data BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

Methods

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

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

toConstr :: BQDataSetReference -> Constr #

dataTypeOf :: BQDataSetReference -> DataType #

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

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

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

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

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

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

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

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

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

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

Generic BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

Associated Types

type Rep BQDataSetReference 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetReference = D1 ('MetaData "BQDataSetReference" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "BQDataSetReference" 'PrefixI 'True) (S1 ('MetaSel ('Just "projectId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BQProjectId)) :*: S1 ('MetaSel ('Just "datasetId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BQDataSetId)))
Show BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

Eq BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

Ord BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetReference # 
Instance details

Defined in Napkin.Types.BigQuery

type Rep BQDataSetReference = D1 ('MetaData "BQDataSetReference" "Napkin.Types.BigQuery" "napkin-backend-bigquery-2.0.0-FxSpdT7ICDUHnvab5tDdSh" 'False) (C1 ('MetaCons "BQDataSetReference" 'PrefixI 'True) (S1 ('MetaSel ('Just "projectId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe BQProjectId)) :*: S1 ('MetaSel ('Just "datasetId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 BQDataSetId)))