wikimusic-api-1.2.0.8
Safe HaskellSafe-Inferred
LanguageGHC2021

WikiMusic.Beam.Artist

Documentation

data ArtistT f Source #

Instances

Instances details
Beamable ArtistT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> ArtistT f -> ArtistT g -> m (ArtistT h) #

tblSkeleton :: TableSkeleton ArtistT #

Table ArtistT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

data PrimaryKey ArtistT column #

Methods

primaryKey :: forall (column :: Type -> Type). ArtistT column -> PrimaryKey ArtistT column #

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "approvedBy" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f UTCTime, b ~ C f UTCTime) => LabelOptic "createdAt" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "createdBy" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "description" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "displayName" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "identifier" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f (Maybe UTCTime), b ~ C f (Maybe UTCTime)) => LabelOptic "lastEditedAt" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f Int64, b ~ C f Int64) => LabelOptic "viewCount" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

(k ~ A_Lens, a ~ C f Int64, b ~ C f Int64) => LabelOptic "visibilityStatus" k (ArtistT f) (ArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

labelOptic :: Optic k NoIx (ArtistT f) (ArtistT f) a b #

Generic (ArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (ArtistT f) :: Type -> Type #

Methods

from :: ArtistT f -> Rep (ArtistT f) x #

to :: Rep (ArtistT f) x -> ArtistT f #

Beamable (PrimaryKey ArtistT) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> PrimaryKey ArtistT f -> PrimaryKey ArtistT g -> m (PrimaryKey ArtistT h) #

tblSkeleton :: TableSkeleton (PrimaryKey ArtistT) #

Generic (PrimaryKey ArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (PrimaryKey ArtistT f) :: Type -> Type #

data PrimaryKey ArtistT f Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistT f) = D1 ('MetaData "ArtistT" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "Artist'" 'PrefixI 'True) (((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "displayName") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text))) :*: (S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "visibilityStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Int64)))) :*: ((S1 ('MetaSel ('Just "approvedBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))) :*: S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime))) :*: (S1 ('MetaSel ('Just "lastEditedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe UTCTime))) :*: (S1 ('MetaSel ('Just "viewCount") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Int64)) :*: S1 ('MetaSel ('Just "description") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))))))))
type Rep (PrimaryKey ArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (PrimaryKey ArtistT f) = D1 ('MetaData "PrimaryKey" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Columnar f Text))))

data ArtistCommentT f Source #

Instances

Instances details
Beamable ArtistCommentT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> ArtistCommentT f -> ArtistCommentT g -> m (ArtistCommentT h) #

tblSkeleton :: TableSkeleton ArtistCommentT #

Table ArtistCommentT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

data PrimaryKey ArtistCommentT column #

Methods

primaryKey :: forall (column :: Type -> Type). ArtistCommentT column -> PrimaryKey ArtistCommentT column #

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "approvedBy" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ PrimaryKey ArtistT f, b ~ PrimaryKey ArtistT f) => LabelOptic "artistIdentifier" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "contents" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f UTCTime, b ~ C f UTCTime) => LabelOptic "createdAt" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "createdBy" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "identifier" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe UTCTime), b ~ C f (Maybe UTCTime)) => LabelOptic "lastEditedAt" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "parentIdentifier" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Int64, b ~ C f Int64) => LabelOptic "visibilityStatus" k (ArtistCommentT f) (ArtistCommentT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Generic (ArtistCommentT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (ArtistCommentT f) :: Type -> Type #

Beamable (PrimaryKey ArtistCommentT) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> PrimaryKey ArtistCommentT f -> PrimaryKey ArtistCommentT g -> m (PrimaryKey ArtistCommentT h) #

tblSkeleton :: TableSkeleton (PrimaryKey ArtistCommentT) #

Generic (PrimaryKey ArtistCommentT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (PrimaryKey ArtistCommentT f) :: Type -> Type #

data PrimaryKey ArtistCommentT f Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistCommentT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistCommentT f) = D1 ('MetaData "ArtistCommentT" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistComment'" 'PrefixI 'True) (((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "parentIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text)))) :*: (S1 ('MetaSel ('Just "artistIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey ArtistT f)) :*: S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)))) :*: ((S1 ('MetaSel ('Just "visibilityStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Int64)) :*: S1 ('MetaSel ('Just "contents") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text))) :*: (S1 ('MetaSel ('Just "approvedBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))) :*: (S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime)) :*: S1 ('MetaSel ('Just "lastEditedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe UTCTime))))))))
type Rep (PrimaryKey ArtistCommentT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (PrimaryKey ArtistCommentT f) = D1 ('MetaData "PrimaryKey" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistCommentId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Columnar f Text))))

data ArtistArtworkT f Source #

Instances

Instances details
Beamable ArtistArtworkT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> ArtistArtworkT f -> ArtistArtworkT g -> m (ArtistArtworkT h) #

tblSkeleton :: TableSkeleton ArtistArtworkT #

Table ArtistArtworkT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

data PrimaryKey ArtistArtworkT column #

Methods

primaryKey :: forall (column :: Type -> Type). ArtistArtworkT column -> PrimaryKey ArtistArtworkT column #

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "approvedBy" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ PrimaryKey ArtistT f, b ~ PrimaryKey ArtistT f) => LabelOptic "artistIdentifier" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "contentCaption" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "contentUrl" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f UTCTime, b ~ C f UTCTime) => LabelOptic "createdAt" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "createdBy" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "identifier" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe UTCTime), b ~ C f (Maybe UTCTime)) => LabelOptic "lastEditedAt" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Int64, b ~ C f Int64) => LabelOptic "orderValue" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Int64, b ~ C f Int64) => LabelOptic "visibilityStatus" k (ArtistArtworkT f) (ArtistArtworkT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Generic (ArtistArtworkT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (ArtistArtworkT f) :: Type -> Type #

Beamable (PrimaryKey ArtistArtworkT) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> PrimaryKey ArtistArtworkT f -> PrimaryKey ArtistArtworkT g -> m (PrimaryKey ArtistArtworkT h) #

tblSkeleton :: TableSkeleton (PrimaryKey ArtistArtworkT) #

Generic (PrimaryKey ArtistArtworkT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (PrimaryKey ArtistArtworkT f) :: Type -> Type #

data PrimaryKey ArtistArtworkT f Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistArtworkT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistArtworkT f) = D1 ('MetaData "ArtistArtworkT" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistArtwork'" 'PrefixI 'True) (((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "artistIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey ArtistT f))) :*: (S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: (S1 ('MetaSel ('Just "visibilityStatus") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Int64)) :*: S1 ('MetaSel ('Just "approvedBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text)))))) :*: ((S1 ('MetaSel ('Just "contentUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "contentCaption") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text)))) :*: (S1 ('MetaSel ('Just "orderValue") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Int64)) :*: (S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime)) :*: S1 ('MetaSel ('Just "lastEditedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe UTCTime))))))))
type Rep (PrimaryKey ArtistArtworkT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (PrimaryKey ArtistArtworkT f) = D1 ('MetaData "PrimaryKey" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistArtworkId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Columnar f Text))))

data ArtistOpinionT f Source #

Instances

Instances details
Beamable ArtistOpinionT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> ArtistOpinionT f -> ArtistOpinionT g -> m (ArtistOpinionT h) #

tblSkeleton :: TableSkeleton ArtistOpinionT #

Table ArtistOpinionT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

data PrimaryKey ArtistOpinionT column #

Methods

primaryKey :: forall (column :: Type -> Type). ArtistOpinionT column -> PrimaryKey ArtistOpinionT column #

(k ~ A_Lens, a ~ PrimaryKey ArtistT f, b ~ PrimaryKey ArtistT f) => LabelOptic "artistIdentifier" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f UTCTime, b ~ C f UTCTime) => LabelOptic "createdAt" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "createdBy" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "identifier" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Bool, b ~ C f Bool) => LabelOptic "isDislike" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Bool, b ~ C f Bool) => LabelOptic "isLike" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe UTCTime), b ~ C f (Maybe UTCTime)) => LabelOptic "lastEditedAt" k (ArtistOpinionT f) (ArtistOpinionT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Generic (ArtistOpinionT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (ArtistOpinionT f) :: Type -> Type #

Beamable (PrimaryKey ArtistOpinionT) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> PrimaryKey ArtistOpinionT f -> PrimaryKey ArtistOpinionT g -> m (PrimaryKey ArtistOpinionT h) #

tblSkeleton :: TableSkeleton (PrimaryKey ArtistOpinionT) #

Generic (PrimaryKey ArtistOpinionT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (PrimaryKey ArtistOpinionT f) :: Type -> Type #

data PrimaryKey ArtistOpinionT f Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistOpinionT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistOpinionT f) = D1 ('MetaData "ArtistOpinionT" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistOpinion'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: (S1 ('MetaSel ('Just "artistIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey ArtistT f)) :*: S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)))) :*: ((S1 ('MetaSel ('Just "isLike") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Bool)) :*: S1 ('MetaSel ('Just "isDislike") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Bool))) :*: (S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime)) :*: S1 ('MetaSel ('Just "lastEditedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe UTCTime)))))))
type Rep (PrimaryKey ArtistOpinionT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (PrimaryKey ArtistOpinionT f) = D1 ('MetaData "PrimaryKey" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistOpinionId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Columnar f Text))))

data ArtistExternalSourcesT f Source #

Instances

Instances details
Beamable ArtistExternalSourcesT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Methods

zipBeamFieldsM :: forall m (f :: Type -> Type) (g :: Type -> Type) (h :: Type -> Type). Applicative m => (forall a. Columnar' f a -> Columnar' g a -> m (Columnar' h a)) -> ArtistExternalSourcesT f -> ArtistExternalSourcesT g -> m (ArtistExternalSourcesT h) #

tblSkeleton :: TableSkeleton ArtistExternalSourcesT #

Table ArtistExternalSourcesT Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

data PrimaryKey ArtistExternalSourcesT column #

Methods

primaryKey :: forall (column :: Type -> Type). ArtistExternalSourcesT column -> PrimaryKey ArtistExternalSourcesT column #

(k ~ A_Lens, a ~ PrimaryKey ArtistT f, b ~ PrimaryKey ArtistT f) => LabelOptic "artistIdentifier" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f UTCTime, b ~ C f UTCTime) => LabelOptic "createdAt" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "createdBy" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f Text, b ~ C f Text) => LabelOptic "identifier" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe UTCTime), b ~ C f (Maybe UTCTime)) => LabelOptic "lastEditedAt" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "soundcloudUrl" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "spotifyUrl" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "wikipediaUrl" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

(k ~ A_Lens, a ~ C f (Maybe Text), b ~ C f (Maybe Text)) => LabelOptic "youtubeUrl" k (ArtistExternalSourcesT f) (ArtistExternalSourcesT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Generic (ArtistExternalSourcesT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (ArtistExternalSourcesT f) :: Type -> Type #

Beamable (PrimaryKey ArtistExternalSourcesT) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Generic (PrimaryKey ArtistExternalSourcesT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

Associated Types

type Rep (PrimaryKey ArtistExternalSourcesT f) :: Type -> Type #

data PrimaryKey ArtistExternalSourcesT f Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistExternalSourcesT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (ArtistExternalSourcesT f) = D1 ('MetaData "ArtistExternalSourcesT" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistExternalSources'" 'PrefixI 'True) (((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "artistIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey ArtistT f))) :*: (S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "spotifyUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))))) :*: ((S1 ('MetaSel ('Just "youtubeUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))) :*: S1 ('MetaSel ('Just "soundcloudUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text)))) :*: (S1 ('MetaSel ('Just "wikipediaUrl") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe Text))) :*: (S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime)) :*: S1 ('MetaSel ('Just "lastEditedAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f (Maybe UTCTime))))))))
type Rep (PrimaryKey ArtistExternalSourcesT f) Source # 
Instance details

Defined in WikiMusic.Beam.Artist

type Rep (PrimaryKey ArtistExternalSourcesT f) = D1 ('MetaData "PrimaryKey" "WikiMusic.Beam.Artist" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistExternalSourcesId" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Columnar f Text))))