yggdrasil-schema-1.0.0.5
Safe HaskellSafe-Inferred
LanguageGHC2021

Yggdrasil

Documentation

data YggdrasilEngine Source #

Constructors

SQLite 
PostgreSQL 
MySQL 

Instances

Instances details
Generic YggdrasilEngine Source # 
Instance details

Defined in Yggdrasil

Associated Types

type Rep YggdrasilEngine :: Type -> Type #

Show YggdrasilEngine Source # 
Instance details

Defined in Yggdrasil

Eq YggdrasilEngine Source # 
Instance details

Defined in Yggdrasil

type Rep YggdrasilEngine Source # 
Instance details

Defined in Yggdrasil

type Rep YggdrasilEngine = D1 ('MetaData "YggdrasilEngine" "Yggdrasil" "yggdrasil-schema-1.0.0.5-9vOeiteFiEZAt0hnKym7Vn" 'False) (C1 ('MetaCons "SQLite" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "PostgreSQL" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "MySQL" 'PrefixI 'False) (U1 :: Type -> Type)))

data Yggdrasil Source #

Instances

Instances details
Generic Yggdrasil Source # 
Instance details

Defined in Yggdrasil

Associated Types

type Rep Yggdrasil :: Type -> Type #

Show Yggdrasil Source # 
Instance details

Defined in Yggdrasil

Eq Yggdrasil Source # 
Instance details

Defined in Yggdrasil

(k ~ A_Lens, a ~ Text, b ~ Text) => LabelOptic "databaseFilePath" k Yggdrasil Yggdrasil a b Source # 
Instance details

Defined in Yggdrasil

(k ~ A_Lens, a ~ YggdrasilEngine, b ~ YggdrasilEngine) => LabelOptic "engine" k Yggdrasil Yggdrasil a b Source # 
Instance details

Defined in Yggdrasil

(k ~ A_Lens, a ~ Text, b ~ Text) => LabelOptic "migrationsDirectoryPath" k Yggdrasil Yggdrasil a b Source # 
Instance details

Defined in Yggdrasil

(k ~ A_Lens, a ~ Bool, b ~ Bool) => LabelOptic "runMigrations" k Yggdrasil Yggdrasil a b Source # 
Instance details

Defined in Yggdrasil

type Rep Yggdrasil Source # 
Instance details

Defined in Yggdrasil

type Rep Yggdrasil = D1 ('MetaData "Yggdrasil" "Yggdrasil" "yggdrasil-schema-1.0.0.5-9vOeiteFiEZAt0hnKym7Vn" 'False) (C1 ('MetaCons "Yggdrasil" 'PrefixI 'True) ((S1 ('MetaSel ('Just "databaseFilePath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text) :*: S1 ('MetaSel ('Just "migrationsDirectoryPath") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)) :*: (S1 ('MetaSel ('Just "runMigrations") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Bool) :*: S1 ('MetaSel ('Just "engine") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 YggdrasilEngine))))

data RanMigration Source #

Instances

Instances details
Generic RanMigration Source # 
Instance details

Defined in Yggdrasil

Associated Types

type Rep RanMigration :: Type -> Type #

Show RanMigration Source # 
Instance details

Defined in Yggdrasil

Eq RanMigration Source # 
Instance details

Defined in Yggdrasil

FromRow RanMigration Source # 
Instance details

Defined in Yggdrasil

type Rep RanMigration Source # 
Instance details

Defined in Yggdrasil

runMigration :: MonadIO m => Yggdrasil -> (Int, Text) -> m () Source #