wikimusic-api-1.2.0.8
Safe HaskellSafe-Inferred
LanguageGHC2021

WikiMusic.Beam.Relations

Documentation

data SongArtistT f Source #

Instances

Instances details
Beamable SongArtistT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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)) -> SongArtistT f -> SongArtistT g -> m (SongArtistT h) #

tblSkeleton :: TableSkeleton SongArtistT #

Table SongArtistT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

data PrimaryKey SongArtistT column #

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

(k ~ A_Lens, a ~ PrimaryKey SongT f, b ~ PrimaryKey SongT f) => LabelOptic "songIdentifier" k (SongArtistT f) (SongArtistT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Methods

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

Generic (SongArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

Methods

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

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

Beamable (PrimaryKey SongArtistT) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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 SongArtistT f -> PrimaryKey SongArtistT g -> m (PrimaryKey SongArtistT h) #

tblSkeleton :: TableSkeleton (PrimaryKey SongArtistT) #

Generic (PrimaryKey SongArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

data PrimaryKey SongArtistT f Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (SongArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (SongArtistT f) = D1 ('MetaData "SongArtistT" "WikiMusic.Beam.Relations" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "SongArtist'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "songIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey SongT f))) :*: (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 "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime))))))
type Rep (PrimaryKey SongArtistT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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

data SongGenreT f Source #

Instances

Instances details
Beamable SongGenreT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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)) -> SongGenreT f -> SongGenreT g -> m (SongGenreT h) #

tblSkeleton :: TableSkeleton SongGenreT #

Table SongGenreT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

data PrimaryKey SongGenreT column #

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

(k ~ A_Lens, a ~ PrimaryKey GenreT f, b ~ PrimaryKey GenreT f) => LabelOptic "genreIdentifier" k (SongGenreT f) (SongGenreT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Methods

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

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

Defined in WikiMusic.Beam.Relations

Methods

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

(k ~ A_Lens, a ~ PrimaryKey SongT f, b ~ PrimaryKey SongT f) => LabelOptic "songIdentifier" k (SongGenreT f) (SongGenreT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Methods

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

Generic (SongGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

Methods

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

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

Beamable (PrimaryKey SongGenreT) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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 SongGenreT f -> PrimaryKey SongGenreT g -> m (PrimaryKey SongGenreT h) #

tblSkeleton :: TableSkeleton (PrimaryKey SongGenreT) #

Generic (PrimaryKey SongGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

data PrimaryKey SongGenreT f Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (SongGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (SongGenreT f) = D1 ('MetaData "SongGenreT" "WikiMusic.Beam.Relations" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "SongGenre'" 'PrefixI 'True) ((S1 ('MetaSel ('Just "identifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "songIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey SongT f))) :*: (S1 ('MetaSel ('Just "genreIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey GenreT f)) :*: (S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime))))))
type Rep (PrimaryKey SongGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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

data ArtistGenreT f Source #

Instances

Instances details
Beamable ArtistGenreT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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)) -> ArtistGenreT f -> ArtistGenreT g -> m (ArtistGenreT h) #

tblSkeleton :: TableSkeleton ArtistGenreT #

Table ArtistGenreT Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

data PrimaryKey ArtistGenreT column #

Methods

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

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

Defined in WikiMusic.Beam.Relations

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

Defined in WikiMusic.Beam.Relations

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

Defined in WikiMusic.Beam.Relations

(k ~ A_Lens, a ~ PrimaryKey GenreT f, b ~ PrimaryKey GenreT f) => LabelOptic "genreIdentifier" k (ArtistGenreT f) (ArtistGenreT f) a b Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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

Defined in WikiMusic.Beam.Relations

Generic (ArtistGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

Methods

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

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

Beamable (PrimaryKey ArtistGenreT) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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 ArtistGenreT f -> PrimaryKey ArtistGenreT g -> m (PrimaryKey ArtistGenreT h) #

tblSkeleton :: TableSkeleton (PrimaryKey ArtistGenreT) #

Generic (PrimaryKey ArtistGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

Associated Types

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

data PrimaryKey ArtistGenreT f Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (ArtistGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

type Rep (ArtistGenreT f) = D1 ('MetaData "ArtistGenreT" "WikiMusic.Beam.Relations" "wikimusic-api-1.2.0.8-JHwpuK3L2G3YDoKuoiL6D" 'False) (C1 ('MetaCons "ArtistGenre'" '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 "genreIdentifier") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (PrimaryKey GenreT f)) :*: (S1 ('MetaSel ('Just "createdBy") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f Text)) :*: S1 ('MetaSel ('Just "createdAt") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (C f UTCTime))))))
type Rep (PrimaryKey ArtistGenreT f) Source # 
Instance details

Defined in WikiMusic.Beam.Relations

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

mkSongGenreP :: forall {k} {k} {k} {k} {k} {s} {f :: Type -> Type}. (Is k A_Getter, Is k A_Getter, Is k A_Getter, Is k A_Getter, Is k A_Getter, LabelOptic "identifier" k s s (Columnar f Text) (Columnar f Text), LabelOptic "createdBy" k s s (Columnar f Text) (Columnar f Text), LabelOptic "createdAt" k s s (Columnar f UTCTime) (Columnar f UTCTime), LabelOptic "songIdentifier" k s s (Columnar f Text) (Columnar f Text), LabelOptic "genreIdentifier" k s s (Columnar f Text) (Columnar f Text)) => s -> SongGenreT f Source #

mkArtistGenreP :: forall {k} {k} {k} {k} {k} {s} {f :: Type -> Type}. (Is k A_Getter, Is k A_Getter, Is k A_Getter, Is k A_Getter, Is k A_Getter, LabelOptic "identifier" k s s (Columnar f Text) (Columnar f Text), LabelOptic "createdBy" k s s (Columnar f Text) (Columnar f Text), LabelOptic "createdAt" k s s (Columnar f UTCTime) (Columnar f UTCTime), LabelOptic "artistIdentifier" k s s (Columnar f Text) (Columnar f Text), LabelOptic "genreIdentifier" k s s (Columnar f Text) (Columnar f Text)) => s -> ArtistGenreT f Source #