Safe Haskell | Safe-Inferred |
---|---|
Language | Haskell2010 |
Sqel.Migration.Metadata
Documentation
Constructors
DbCols | |
Fields |
Instances
Generic DbCols Source # | |
Show DbCols Source # | |
Eq DbCols Source # | |
type Rep DbCols Source # | |
Defined in Sqel.Migration.Metadata type Rep DbCols = D1 ('MetaData "DbCols" "Sqel.Migration.Metadata" "sqel-0.0.1.0-5k4czMecwS553bFrfF1Jzu" 'True) (C1 ('MetaCons "DbCols" 'PrefixI 'True) (S1 ('MetaSel ('Just "unDbCols") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Map PgColumnName (Either PgTypeRef PgPrimName))))) |
newtype PrettyColMap Source #
Constructors
PrettyColMap | |
Fields |
Instances
Generic PrettyColMap Source # | |
Defined in Sqel.Migration.Metadata Associated Types type Rep PrettyColMap :: Type -> Type # | |
Show PrettyColMap Source # | |
Defined in Sqel.Migration.Metadata Methods showsPrec :: Int -> PrettyColMap -> ShowS # show :: PrettyColMap -> String # showList :: [PrettyColMap] -> ShowS # | |
Eq PrettyColMap Source # | |
Defined in Sqel.Migration.Metadata | |
Pretty PrettyColMap Source # | |
Defined in Sqel.Migration.Metadata | |
type Rep PrettyColMap Source # | |
Defined in Sqel.Migration.Metadata type Rep PrettyColMap = D1 ('MetaData "PrettyColMap" "Sqel.Migration.Metadata" "sqel-0.0.1.0-5k4czMecwS553bFrfF1Jzu" 'True) (C1 ('MetaCons "PrettyColMap" 'PrefixI 'True) (S1 ('MetaSel ('Just "unPrettyColMap") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 DbCols))) |
typeColumns :: Monad m => MigrationEffect m => Sql -> PgTypeName table -> m DbCols Source #
tableColumns :: Monad m => MigrationEffect m => PgTableName -> m DbCols Source #
columnMap :: [PgColumn] -> Map PgColumnName ColumnType Source #
data TypeStatus Source #
Instances
Generic TypeStatus Source # | |
Defined in Sqel.Migration.Metadata Associated Types type Rep TypeStatus :: Type -> Type # | |
Show TypeStatus Source # | |
Defined in Sqel.Migration.Metadata Methods showsPrec :: Int -> TypeStatus -> ShowS # show :: TypeStatus -> String # showList :: [TypeStatus] -> ShowS # | |
Eq TypeStatus Source # | |
Defined in Sqel.Migration.Metadata | |
type Rep TypeStatus Source # | |
Defined in Sqel.Migration.Metadata type Rep TypeStatus = D1 ('MetaData "TypeStatus" "Sqel.Migration.Metadata" "sqel-0.0.1.0-5k4czMecwS553bFrfF1Jzu" 'False) (C1 ('MetaCons "Absent" 'PrefixI 'False) (U1 :: Type -> Type) :+: (C1 ('MetaCons "Mismatch" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "Match" 'PrefixI 'False) (U1 :: Type -> Type))) |
typeStatus :: DbCols -> DbCols -> TypeStatus Source #