Hets - the Heterogeneous Tool Set
Copyright(c) Uni Magdeburg 2017
LicenseGPLv2 or higher, see LICENSE.txt
MaintainerEugen Kuksa <kuksa@iks.cs.ovgu.de>
Stabilityprovisional
Portabilityportable
Safe HaskellNone

Persistence.Schema

Description

 

Documentation

indexes :: [(String, [String])] Source #

data Hets Source #

Constructors

Hets 

Fields

Instances

Instances details
Show Hets Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Hets -> ShowS

show :: Hets -> String

showList :: [Hets] -> ShowS

PersistEntity Hets Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Hets

data Key Hets

data EntityField Hets :: Type -> Type

data Unique Hets

Methods

keyToValues :: Key Hets -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Hets)

persistIdField :: EntityField Hets (Key Hets)

entityDef :: Monad m => m Hets -> EntityDef

persistFieldDef :: EntityField Hets typ -> FieldDef

toPersistFields :: Hets -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Hets

persistUniqueKeys :: Hets -> [Unique Hets]

persistUniqueToFieldNames :: Unique Hets -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Hets -> [PersistValue]

fieldLens :: EntityField Hets field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Hets -> f (Entity Hets)

PersistField Hets Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Hets -> PersistValue

fromPersistValue :: PersistValue -> Either Text Hets

(TypeError (MultipleUniqueKeysError Hets) :: Constraint) => AtLeastOneUniqueKey Hets Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Hets -> NonEmpty (Unique Hets)

(TypeError (NoUniqueKeysError Hets) :: Constraint) => OnlyOneUniqueKey Hets Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Hets -> Unique Hets

PersistFieldSql Hets Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Hets -> SqlType

(PersistQuery backend, PersistEntityBackend Hets ~ BaseBackend backend) => DeleteCascade Hets backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Hets -> ReaderT backend m ()

Eq (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Hets -> Key Hets -> Bool

(/=) :: Key Hets -> Key Hets -> Bool

Ord (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Hets -> Key Hets -> Ordering

(<) :: Key Hets -> Key Hets -> Bool

(<=) :: Key Hets -> Key Hets -> Bool

(>) :: Key Hets -> Key Hets -> Bool

(>=) :: Key Hets -> Key Hets -> Bool

max :: Key Hets -> Key Hets -> Key Hets

min :: Key Hets -> Key Hets -> Key Hets

Read (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Hets)

readList :: ReadS [Key Hets]

readPrec :: ReadPrec (Key Hets)

readListPrec :: ReadPrec [Key Hets]

Show (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Hets -> ShowS

show :: Key Hets -> String

showList :: [Key Hets] -> ShowS

FromJSON (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Hets)

parseJSONList :: Value -> Parser [Key Hets]

ToJSON (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Hets -> Value

toEncoding :: Key Hets -> Encoding

toJSONList :: [Key Hets] -> Value

toEncodingList :: [Key Hets] -> Encoding

PersistField (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Hets -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Hets)

PersistFieldSql (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Hets) -> SqlType

FromHttpApiData (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Hets)

parseHeader :: ByteString -> Either Text (Key Hets)

parseQueryParam :: Text -> Either Text (Key Hets)

PathPiece (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Hets)

toPathPiece :: Key Hets -> Text

ToHttpApiData (Key Hets) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Hets -> Text

toEncodedUrlPiece :: Key Hets -> Builder

toHeader :: Key Hets -> ByteString

toQueryParam :: Key Hets -> Text

data EntityField Hets typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Hets typ
newtype Key Hets Source # 
Instance details

Defined in Persistence.Schema

newtype Key Hets = HetsKey' {}
type PersistEntityBackend Hets Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Hets = SqlBackend
data Unique Hets Source # 
Instance details

Defined in Persistence.Schema

data Unique Hets

type HetsId = Key Hets Source #

data Language Source #

Constructors

Language 

Fields

Instances

Instances details
Show Language Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Language -> ShowS

show :: Language -> String

showList :: [Language] -> ShowS

PersistEntity Language Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Language

data Key Language

data EntityField Language :: Type -> Type

data Unique Language

Methods

keyToValues :: Key Language -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Language)

persistIdField :: EntityField Language (Key Language)

entityDef :: Monad m => m Language -> EntityDef

persistFieldDef :: EntityField Language typ -> FieldDef

toPersistFields :: Language -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Language

persistUniqueKeys :: Language -> [Unique Language]

persistUniqueToFieldNames :: Unique Language -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Language -> [PersistValue]

fieldLens :: EntityField Language field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Language -> f (Entity Language)

PersistField Language Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Language -> PersistValue

fromPersistValue :: PersistValue -> Either Text Language

AtLeastOneUniqueKey Language Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Language -> NonEmpty (Unique Language)

OnlyOneUniqueKey Language Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Language -> Unique Language

PersistFieldSql Language Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Language -> SqlType

(PersistQuery backend, PersistEntityBackend Language ~ BaseBackend backend) => DeleteCascade Language backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Language -> ReaderT backend m ()

ToBackendKey SqlBackend Language Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Language -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Language

Eq (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Language -> Key Language -> Bool

(/=) :: Key Language -> Key Language -> Bool

Ord (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Language -> Key Language -> Ordering

(<) :: Key Language -> Key Language -> Bool

(<=) :: Key Language -> Key Language -> Bool

(>) :: Key Language -> Key Language -> Bool

(>=) :: Key Language -> Key Language -> Bool

max :: Key Language -> Key Language -> Key Language

min :: Key Language -> Key Language -> Key Language

Read (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Language)

readList :: ReadS [Key Language]

readPrec :: ReadPrec (Key Language)

readListPrec :: ReadPrec [Key Language]

Show (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Language -> ShowS

show :: Key Language -> String

showList :: [Key Language] -> ShowS

Show (Unique Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique Language -> ShowS

show :: Unique Language -> String

showList :: [Unique Language] -> ShowS

FromJSON (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Language)

parseJSONList :: Value -> Parser [Key Language]

ToJSON (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Language -> Value

toEncoding :: Key Language -> Encoding

toJSONList :: [Key Language] -> Value

toEncodingList :: [Key Language] -> Encoding

PersistField (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Language -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Language)

PersistFieldSql (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Language) -> SqlType

FromHttpApiData (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Language)

parseHeader :: ByteString -> Either Text (Key Language)

parseQueryParam :: Text -> Either Text (Key Language)

PathPiece (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Language)

toPathPiece :: Key Language -> Text

ToHttpApiData (Key Language) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Language -> Text

toEncodedUrlPiece :: Key Language -> Builder

toHeader :: Key Language -> ByteString

toQueryParam :: Key Language -> Text

data EntityField Language typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Language typ
newtype Key Language Source # 
Instance details

Defined in Persistence.Schema

newtype Key Language = LanguageKey {}
type PersistEntityBackend Language Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Language = SqlBackend
data Unique Language Source # 
Instance details

Defined in Persistence.Schema

data Unique Language = UniqueLanguageSlug String

data Logic Source #

Constructors

Logic 

Fields

Instances

Instances details
Show Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Logic -> ShowS

show :: Logic -> String

showList :: [Logic] -> ShowS

PersistEntity Logic Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Logic

data Key Logic

data EntityField Logic :: Type -> Type

data Unique Logic

Methods

keyToValues :: Key Logic -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Logic)

persistIdField :: EntityField Logic (Key Logic)

entityDef :: Monad m => m Logic -> EntityDef

persistFieldDef :: EntityField Logic typ -> FieldDef

toPersistFields :: Logic -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Logic

persistUniqueKeys :: Logic -> [Unique Logic]

persistUniqueToFieldNames :: Unique Logic -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Logic -> [PersistValue]

fieldLens :: EntityField Logic field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Logic -> f (Entity Logic)

PersistField Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Logic -> PersistValue

fromPersistValue :: PersistValue -> Either Text Logic

AtLeastOneUniqueKey Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Logic -> NonEmpty (Unique Logic)

OnlyOneUniqueKey Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Logic -> Unique Logic

PersistFieldSql Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Logic -> SqlType

(PersistQuery backend, PersistEntityBackend Logic ~ BaseBackend backend) => DeleteCascade Logic backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Logic -> ReaderT backend m ()

ToBackendKey SqlBackend Logic Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Logic -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Logic

Eq (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Logic -> Key Logic -> Bool

(/=) :: Key Logic -> Key Logic -> Bool

Ord (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Logic -> Key Logic -> Ordering

(<) :: Key Logic -> Key Logic -> Bool

(<=) :: Key Logic -> Key Logic -> Bool

(>) :: Key Logic -> Key Logic -> Bool

(>=) :: Key Logic -> Key Logic -> Bool

max :: Key Logic -> Key Logic -> Key Logic

min :: Key Logic -> Key Logic -> Key Logic

Read (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Logic)

readList :: ReadS [Key Logic]

readPrec :: ReadPrec (Key Logic)

readListPrec :: ReadPrec [Key Logic]

Show (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Logic -> ShowS

show :: Key Logic -> String

showList :: [Key Logic] -> ShowS

Show (Unique Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique Logic -> ShowS

show :: Unique Logic -> String

showList :: [Unique Logic] -> ShowS

FromJSON (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Logic)

parseJSONList :: Value -> Parser [Key Logic]

ToJSON (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Logic -> Value

toEncoding :: Key Logic -> Encoding

toJSONList :: [Key Logic] -> Value

toEncodingList :: [Key Logic] -> Encoding

PersistField (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Logic -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Logic)

PersistFieldSql (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Logic) -> SqlType

FromHttpApiData (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Logic)

parseHeader :: ByteString -> Either Text (Key Logic)

parseQueryParam :: Text -> Either Text (Key Logic)

PathPiece (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Logic)

toPathPiece :: Key Logic -> Text

ToHttpApiData (Key Logic) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Logic -> Text

toEncodedUrlPiece :: Key Logic -> Builder

toHeader :: Key Logic -> ByteString

toQueryParam :: Key Logic -> Text

data EntityField Logic typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Logic typ
newtype Key Logic Source # 
Instance details

Defined in Persistence.Schema

newtype Key Logic = LogicKey {}
type PersistEntityBackend Logic Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Logic = SqlBackend
data Unique Logic Source # 
Instance details

Defined in Persistence.Schema

data Unique Logic = UniqueLanguageIdLogicSlug (Key Language) String

type LogicId = Key Logic Source #

data LanguageMapping Source #

Instances

Instances details
Show LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LanguageMapping -> ShowS

show :: LanguageMapping -> String

showList :: [LanguageMapping] -> ShowS

PersistEntity LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LanguageMapping

data Key LanguageMapping

data EntityField LanguageMapping :: Type -> Type

data Unique LanguageMapping

Methods

keyToValues :: Key LanguageMapping -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LanguageMapping)

persistIdField :: EntityField LanguageMapping (Key LanguageMapping)

entityDef :: Monad m => m LanguageMapping -> EntityDef

persistFieldDef :: EntityField LanguageMapping typ -> FieldDef

toPersistFields :: LanguageMapping -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LanguageMapping

persistUniqueKeys :: LanguageMapping -> [Unique LanguageMapping]

persistUniqueToFieldNames :: Unique LanguageMapping -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LanguageMapping -> [PersistValue]

fieldLens :: EntityField LanguageMapping field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LanguageMapping -> f (Entity LanguageMapping)

PersistField LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LanguageMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text LanguageMapping

(TypeError (MultipleUniqueKeysError LanguageMapping) :: Constraint) => AtLeastOneUniqueKey LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: LanguageMapping -> NonEmpty (Unique LanguageMapping)

(TypeError (NoUniqueKeysError LanguageMapping) :: Constraint) => OnlyOneUniqueKey LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LanguageMapping -> SqlType

(PersistQuery backend, PersistEntityBackend LanguageMapping ~ BaseBackend backend) => DeleteCascade LanguageMapping backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LanguageMapping -> ReaderT backend m ()

ToBackendKey SqlBackend LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LanguageMapping -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LanguageMapping

Eq (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key LanguageMapping -> Key LanguageMapping -> Bool

(/=) :: Key LanguageMapping -> Key LanguageMapping -> Bool

Ord (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key LanguageMapping -> Key LanguageMapping -> Ordering

(<) :: Key LanguageMapping -> Key LanguageMapping -> Bool

(<=) :: Key LanguageMapping -> Key LanguageMapping -> Bool

(>) :: Key LanguageMapping -> Key LanguageMapping -> Bool

(>=) :: Key LanguageMapping -> Key LanguageMapping -> Bool

max :: Key LanguageMapping -> Key LanguageMapping -> Key LanguageMapping

min :: Key LanguageMapping -> Key LanguageMapping -> Key LanguageMapping

Read (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LanguageMapping)

readList :: ReadS [Key LanguageMapping]

readPrec :: ReadPrec (Key LanguageMapping)

readListPrec :: ReadPrec [Key LanguageMapping]

Show (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LanguageMapping -> ShowS

show :: Key LanguageMapping -> String

showList :: [Key LanguageMapping] -> ShowS

FromJSON (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LanguageMapping)

parseJSONList :: Value -> Parser [Key LanguageMapping]

ToJSON (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LanguageMapping -> Value

toEncoding :: Key LanguageMapping -> Encoding

toJSONList :: [Key LanguageMapping] -> Value

toEncodingList :: [Key LanguageMapping] -> Encoding

PersistField (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LanguageMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LanguageMapping)

PersistFieldSql (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LanguageMapping) -> SqlType

FromHttpApiData (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LanguageMapping)

parseHeader :: ByteString -> Either Text (Key LanguageMapping)

parseQueryParam :: Text -> Either Text (Key LanguageMapping)

PathPiece (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LanguageMapping)

toPathPiece :: Key LanguageMapping -> Text

ToHttpApiData (Key LanguageMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key LanguageMapping -> Text

toEncodedUrlPiece :: Key LanguageMapping -> Builder

toHeader :: Key LanguageMapping -> ByteString

toQueryParam :: Key LanguageMapping -> Text

data EntityField LanguageMapping typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

newtype Key LanguageMapping = LanguageMappingKey {}
type PersistEntityBackend LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LanguageMapping = SqlBackend
data Unique LanguageMapping Source # 
Instance details

Defined in Persistence.Schema

data Unique LanguageMapping

data LogicMapping Source #

Instances

Instances details
Show LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LogicMapping -> ShowS

show :: LogicMapping -> String

showList :: [LogicMapping] -> ShowS

PersistEntity LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LogicMapping

data Key LogicMapping

data EntityField LogicMapping :: Type -> Type

data Unique LogicMapping

Methods

keyToValues :: Key LogicMapping -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LogicMapping)

persistIdField :: EntityField LogicMapping (Key LogicMapping)

entityDef :: Monad m => m LogicMapping -> EntityDef

persistFieldDef :: EntityField LogicMapping typ -> FieldDef

toPersistFields :: LogicMapping -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LogicMapping

persistUniqueKeys :: LogicMapping -> [Unique LogicMapping]

persistUniqueToFieldNames :: Unique LogicMapping -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LogicMapping -> [PersistValue]

fieldLens :: EntityField LogicMapping field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LogicMapping -> f (Entity LogicMapping)

PersistField LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LogicMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text LogicMapping

AtLeastOneUniqueKey LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: LogicMapping -> NonEmpty (Unique LogicMapping)

OnlyOneUniqueKey LogicMapping Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LogicMapping -> SqlType

(PersistQuery backend, PersistEntityBackend LogicMapping ~ BaseBackend backend) => DeleteCascade LogicMapping backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LogicMapping -> ReaderT backend m ()

ToBackendKey SqlBackend LogicMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LogicMapping -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LogicMapping

Eq (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key LogicMapping -> Key LogicMapping -> Bool

(/=) :: Key LogicMapping -> Key LogicMapping -> Bool

Ord (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key LogicMapping -> Key LogicMapping -> Ordering

(<) :: Key LogicMapping -> Key LogicMapping -> Bool

(<=) :: Key LogicMapping -> Key LogicMapping -> Bool

(>) :: Key LogicMapping -> Key LogicMapping -> Bool

(>=) :: Key LogicMapping -> Key LogicMapping -> Bool

max :: Key LogicMapping -> Key LogicMapping -> Key LogicMapping

min :: Key LogicMapping -> Key LogicMapping -> Key LogicMapping

Read (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LogicMapping)

readList :: ReadS [Key LogicMapping]

readPrec :: ReadPrec (Key LogicMapping)

readListPrec :: ReadPrec [Key LogicMapping]

Show (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LogicMapping -> ShowS

show :: Key LogicMapping -> String

showList :: [Key LogicMapping] -> ShowS

Show (Unique LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique LogicMapping -> ShowS

show :: Unique LogicMapping -> String

showList :: [Unique LogicMapping] -> ShowS

FromJSON (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LogicMapping)

parseJSONList :: Value -> Parser [Key LogicMapping]

ToJSON (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LogicMapping -> Value

toEncoding :: Key LogicMapping -> Encoding

toJSONList :: [Key LogicMapping] -> Value

toEncodingList :: [Key LogicMapping] -> Encoding

PersistField (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LogicMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LogicMapping)

PersistFieldSql (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LogicMapping) -> SqlType

FromHttpApiData (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LogicMapping)

parseHeader :: ByteString -> Either Text (Key LogicMapping)

parseQueryParam :: Text -> Either Text (Key LogicMapping)

PathPiece (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LogicMapping)

toPathPiece :: Key LogicMapping -> Text

ToHttpApiData (Key LogicMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key LogicMapping -> Text

toEncodedUrlPiece :: Key LogicMapping -> Builder

toHeader :: Key LogicMapping -> ByteString

toQueryParam :: Key LogicMapping -> Text

data EntityField LogicMapping typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField LogicMapping typ
newtype Key LogicMapping Source # 
Instance details

Defined in Persistence.Schema

newtype Key LogicMapping = LogicMappingKey {}
type PersistEntityBackend LogicMapping Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LogicMapping = SqlBackend
data Unique LogicMapping Source # 
Instance details

Defined in Persistence.Schema

data LogicInclusion Source #

Constructors

LogicInclusion 

Instances

Instances details
Show LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LogicInclusion -> ShowS

show :: LogicInclusion -> String

showList :: [LogicInclusion] -> ShowS

PersistEntity LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LogicInclusion

data Key LogicInclusion

data EntityField LogicInclusion :: Type -> Type

data Unique LogicInclusion

Methods

keyToValues :: Key LogicInclusion -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LogicInclusion)

persistIdField :: EntityField LogicInclusion (Key LogicInclusion)

entityDef :: Monad m => m LogicInclusion -> EntityDef

persistFieldDef :: EntityField LogicInclusion typ -> FieldDef

toPersistFields :: LogicInclusion -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LogicInclusion

persistUniqueKeys :: LogicInclusion -> [Unique LogicInclusion]

persistUniqueToFieldNames :: Unique LogicInclusion -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LogicInclusion -> [PersistValue]

fieldLens :: EntityField LogicInclusion field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LogicInclusion -> f (Entity LogicInclusion)

PersistField LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LogicInclusion -> PersistValue

fromPersistValue :: PersistValue -> Either Text LogicInclusion

AtLeastOneUniqueKey LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: LogicInclusion -> NonEmpty (Unique LogicInclusion)

(TypeError (MultipleUniqueKeysError LogicInclusion) :: Constraint) => OnlyOneUniqueKey LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LogicInclusion -> SqlType

(PersistQuery backend, PersistEntityBackend LogicInclusion ~ BaseBackend backend) => DeleteCascade LogicInclusion backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LogicInclusion -> ReaderT backend m ()

ToBackendKey SqlBackend LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LogicInclusion -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LogicInclusion

Eq (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key LogicInclusion -> Key LogicInclusion -> Bool

(/=) :: Key LogicInclusion -> Key LogicInclusion -> Bool

Ord (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key LogicInclusion -> Key LogicInclusion -> Ordering

(<) :: Key LogicInclusion -> Key LogicInclusion -> Bool

(<=) :: Key LogicInclusion -> Key LogicInclusion -> Bool

(>) :: Key LogicInclusion -> Key LogicInclusion -> Bool

(>=) :: Key LogicInclusion -> Key LogicInclusion -> Bool

max :: Key LogicInclusion -> Key LogicInclusion -> Key LogicInclusion

min :: Key LogicInclusion -> Key LogicInclusion -> Key LogicInclusion

Read (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LogicInclusion)

readList :: ReadS [Key LogicInclusion]

readPrec :: ReadPrec (Key LogicInclusion)

readListPrec :: ReadPrec [Key LogicInclusion]

Show (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LogicInclusion -> ShowS

show :: Key LogicInclusion -> String

showList :: [Key LogicInclusion] -> ShowS

Show (Unique LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique LogicInclusion -> ShowS

show :: Unique LogicInclusion -> String

showList :: [Unique LogicInclusion] -> ShowS

FromJSON (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LogicInclusion)

parseJSONList :: Value -> Parser [Key LogicInclusion]

ToJSON (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LogicInclusion -> Value

toEncoding :: Key LogicInclusion -> Encoding

toJSONList :: [Key LogicInclusion] -> Value

toEncodingList :: [Key LogicInclusion] -> Encoding

PersistField (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LogicInclusion -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LogicInclusion)

PersistFieldSql (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LogicInclusion) -> SqlType

FromHttpApiData (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LogicInclusion)

parseHeader :: ByteString -> Either Text (Key LogicInclusion)

parseQueryParam :: Text -> Either Text (Key LogicInclusion)

PathPiece (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LogicInclusion)

toPathPiece :: Key LogicInclusion -> Text

ToHttpApiData (Key LogicInclusion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key LogicInclusion -> Text

toEncodedUrlPiece :: Key LogicInclusion -> Builder

toHeader :: Key LogicInclusion -> ByteString

toQueryParam :: Key LogicInclusion -> Text

data EntityField LogicInclusion typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField LogicInclusion typ
newtype Key LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

newtype Key LogicInclusion = LogicInclusionKey {}
type PersistEntityBackend LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LogicInclusion = SqlBackend
data Unique LogicInclusion Source # 
Instance details

Defined in Persistence.Schema

data LogicTranslation Source #

Constructors

LogicTranslation 

Fields

Instances

Instances details
Show LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LogicTranslation -> ShowS

show :: LogicTranslation -> String

showList :: [LogicTranslation] -> ShowS

PersistEntity LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LogicTranslation

data Key LogicTranslation

data EntityField LogicTranslation :: Type -> Type

data Unique LogicTranslation

Methods

keyToValues :: Key LogicTranslation -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LogicTranslation)

persistIdField :: EntityField LogicTranslation (Key LogicTranslation)

entityDef :: Monad m => m LogicTranslation -> EntityDef

persistFieldDef :: EntityField LogicTranslation typ -> FieldDef

toPersistFields :: LogicTranslation -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LogicTranslation

persistUniqueKeys :: LogicTranslation -> [Unique LogicTranslation]

persistUniqueToFieldNames :: Unique LogicTranslation -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LogicTranslation -> [PersistValue]

fieldLens :: EntityField LogicTranslation field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LogicTranslation -> f (Entity LogicTranslation)

PersistField LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LogicTranslation -> PersistValue

fromPersistValue :: PersistValue -> Either Text LogicTranslation

AtLeastOneUniqueKey LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: LogicTranslation -> NonEmpty (Unique LogicTranslation)

(TypeError (MultipleUniqueKeysError LogicTranslation) :: Constraint) => OnlyOneUniqueKey LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LogicTranslation -> SqlType

(PersistQuery backend, PersistEntityBackend LogicTranslation ~ BaseBackend backend) => DeleteCascade LogicTranslation backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LogicTranslation -> ReaderT backend m ()

ToBackendKey SqlBackend LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LogicTranslation -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LogicTranslation

Eq (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key LogicTranslation -> Key LogicTranslation -> Bool

(/=) :: Key LogicTranslation -> Key LogicTranslation -> Bool

Ord (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Read (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LogicTranslation)

readList :: ReadS [Key LogicTranslation]

readPrec :: ReadPrec (Key LogicTranslation)

readListPrec :: ReadPrec [Key LogicTranslation]

Show (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LogicTranslation -> ShowS

show :: Key LogicTranslation -> String

showList :: [Key LogicTranslation] -> ShowS

Show (Unique LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique LogicTranslation -> ShowS

show :: Unique LogicTranslation -> String

showList :: [Unique LogicTranslation] -> ShowS

FromJSON (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LogicTranslation)

parseJSONList :: Value -> Parser [Key LogicTranslation]

ToJSON (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LogicTranslation -> Value

toEncoding :: Key LogicTranslation -> Encoding

toJSONList :: [Key LogicTranslation] -> Value

toEncodingList :: [Key LogicTranslation] -> Encoding

PersistField (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LogicTranslation -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LogicTranslation)

PersistFieldSql (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LogicTranslation) -> SqlType

FromHttpApiData (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LogicTranslation)

parseHeader :: ByteString -> Either Text (Key LogicTranslation)

parseQueryParam :: Text -> Either Text (Key LogicTranslation)

PathPiece (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LogicTranslation)

toPathPiece :: Key LogicTranslation -> Text

ToHttpApiData (Key LogicTranslation) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key LogicTranslation -> Text

toEncodedUrlPiece :: Key LogicTranslation -> Builder

toHeader :: Key LogicTranslation -> ByteString

toQueryParam :: Key LogicTranslation -> Text

data EntityField LogicTranslation typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField LogicTranslation typ
newtype Key LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

newtype Key LogicTranslation = LogicTranslationKey {}
type PersistEntityBackend LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LogicTranslation = SqlBackend
data Unique LogicTranslation Source # 
Instance details

Defined in Persistence.Schema

data LogicTranslationStep Source #

Instances

Instances details
Show LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LogicTranslationStep -> ShowS

show :: LogicTranslationStep -> String

showList :: [LogicTranslationStep] -> ShowS

PersistEntity LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LogicTranslationStep

data Key LogicTranslationStep

data EntityField LogicTranslationStep :: Type -> Type

data Unique LogicTranslationStep

Methods

keyToValues :: Key LogicTranslationStep -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LogicTranslationStep)

persistIdField :: EntityField LogicTranslationStep (Key LogicTranslationStep)

entityDef :: Monad m => m LogicTranslationStep -> EntityDef

persistFieldDef :: EntityField LogicTranslationStep typ -> FieldDef

toPersistFields :: LogicTranslationStep -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LogicTranslationStep

persistUniqueKeys :: LogicTranslationStep -> [Unique LogicTranslationStep]

persistUniqueToFieldNames :: Unique LogicTranslationStep -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LogicTranslationStep -> [PersistValue]

fieldLens :: EntityField LogicTranslationStep field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LogicTranslationStep -> f (Entity LogicTranslationStep)

PersistField LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LogicTranslationStep -> PersistValue

fromPersistValue :: PersistValue -> Either Text LogicTranslationStep

AtLeastOneUniqueKey LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

OnlyOneUniqueKey LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LogicTranslationStep -> SqlType

(PersistQuery backend, PersistEntityBackend LogicTranslationStep ~ BaseBackend backend) => DeleteCascade LogicTranslationStep backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LogicTranslationStep -> ReaderT backend m ()

ToBackendKey SqlBackend LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LogicTranslationStep -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LogicTranslationStep

Eq (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Read (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LogicTranslationStep)

readList :: ReadS [Key LogicTranslationStep]

readPrec :: ReadPrec (Key LogicTranslationStep)

readListPrec :: ReadPrec [Key LogicTranslationStep]

Show (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LogicTranslationStep -> ShowS

show :: Key LogicTranslationStep -> String

showList :: [Key LogicTranslationStep] -> ShowS

Show (Unique LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique LogicTranslationStep -> ShowS

show :: Unique LogicTranslationStep -> String

showList :: [Unique LogicTranslationStep] -> ShowS

FromJSON (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LogicTranslationStep)

parseJSONList :: Value -> Parser [Key LogicTranslationStep]

ToJSON (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LogicTranslationStep -> Value

toEncoding :: Key LogicTranslationStep -> Encoding

toJSONList :: [Key LogicTranslationStep] -> Value

toEncodingList :: [Key LogicTranslationStep] -> Encoding

PersistField (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LogicTranslationStep -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LogicTranslationStep)

PersistFieldSql (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LogicTranslationStep) -> SqlType

FromHttpApiData (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LogicTranslationStep)

parseHeader :: ByteString -> Either Text (Key LogicTranslationStep)

parseQueryParam :: Text -> Either Text (Key LogicTranslationStep)

PathPiece (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LogicTranslationStep)

toPathPiece :: Key LogicTranslationStep -> Text

ToHttpApiData (Key LogicTranslationStep) Source # 
Instance details

Defined in Persistence.Schema

data EntityField LogicTranslationStep typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LogicTranslationStep = SqlBackend
data Unique LogicTranslationStep Source # 
Instance details

Defined in Persistence.Schema

data Serialization Source #

Constructors

Serialization 

Fields

Instances

Instances details
Show Serialization Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Serialization -> ShowS

show :: Serialization -> String

showList :: [Serialization] -> ShowS

PersistEntity Serialization Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Serialization

data Key Serialization

data EntityField Serialization :: Type -> Type

data Unique Serialization

Methods

keyToValues :: Key Serialization -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Serialization)

persistIdField :: EntityField Serialization (Key Serialization)

entityDef :: Monad m => m Serialization -> EntityDef

persistFieldDef :: EntityField Serialization typ -> FieldDef

toPersistFields :: Serialization -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Serialization

persistUniqueKeys :: Serialization -> [Unique Serialization]

persistUniqueToFieldNames :: Unique Serialization -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Serialization -> [PersistValue]

fieldLens :: EntityField Serialization field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Serialization -> f (Entity Serialization)

PersistField Serialization Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Serialization -> PersistValue

fromPersistValue :: PersistValue -> Either Text Serialization

AtLeastOneUniqueKey Serialization Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Serialization -> NonEmpty (Unique Serialization)

OnlyOneUniqueKey Serialization Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql Serialization Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Serialization -> SqlType

(PersistQuery backend, PersistEntityBackend Serialization ~ BaseBackend backend) => DeleteCascade Serialization backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Serialization -> ReaderT backend m ()

ToBackendKey SqlBackend Serialization Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Serialization -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Serialization

Eq (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Serialization -> Key Serialization -> Bool

(/=) :: Key Serialization -> Key Serialization -> Bool

Ord (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Serialization -> Key Serialization -> Ordering

(<) :: Key Serialization -> Key Serialization -> Bool

(<=) :: Key Serialization -> Key Serialization -> Bool

(>) :: Key Serialization -> Key Serialization -> Bool

(>=) :: Key Serialization -> Key Serialization -> Bool

max :: Key Serialization -> Key Serialization -> Key Serialization

min :: Key Serialization -> Key Serialization -> Key Serialization

Read (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Serialization)

readList :: ReadS [Key Serialization]

readPrec :: ReadPrec (Key Serialization)

readListPrec :: ReadPrec [Key Serialization]

Show (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Serialization -> ShowS

show :: Key Serialization -> String

showList :: [Key Serialization] -> ShowS

Show (Unique Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique Serialization -> ShowS

show :: Unique Serialization -> String

showList :: [Unique Serialization] -> ShowS

FromJSON (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Serialization)

parseJSONList :: Value -> Parser [Key Serialization]

ToJSON (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Serialization -> Value

toEncoding :: Key Serialization -> Encoding

toJSONList :: [Key Serialization] -> Value

toEncodingList :: [Key Serialization] -> Encoding

PersistField (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Serialization -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Serialization)

PersistFieldSql (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Serialization) -> SqlType

FromHttpApiData (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Serialization)

parseHeader :: ByteString -> Either Text (Key Serialization)

parseQueryParam :: Text -> Either Text (Key Serialization)

PathPiece (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Serialization)

toPathPiece :: Key Serialization -> Text

ToHttpApiData (Key Serialization) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Serialization -> Text

toEncodedUrlPiece :: Key Serialization -> Builder

toHeader :: Key Serialization -> ByteString

toQueryParam :: Key Serialization -> Text

data EntityField Serialization typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Serialization typ
newtype Key Serialization Source # 
Instance details

Defined in Persistence.Schema

newtype Key Serialization = SerializationKey {}
type PersistEntityBackend Serialization Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Serialization = SqlBackend
data Unique Serialization Source # 
Instance details

Defined in Persistence.Schema

data Signature Source #

Constructors

Signature 

Fields

Instances

Instances details
PersistEntity Signature Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Signature

data Key Signature

data EntityField Signature :: Type -> Type

data Unique Signature

Methods

keyToValues :: Key Signature -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Signature)

persistIdField :: EntityField Signature (Key Signature)

entityDef :: Monad m => m Signature -> EntityDef

persistFieldDef :: EntityField Signature typ -> FieldDef

toPersistFields :: Signature -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Signature

persistUniqueKeys :: Signature -> [Unique Signature]

persistUniqueToFieldNames :: Unique Signature -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Signature -> [PersistValue]

fieldLens :: EntityField Signature field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Signature -> f (Entity Signature)

PersistField Signature Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Signature -> PersistValue

fromPersistValue :: PersistValue -> Either Text Signature

(TypeError (MultipleUniqueKeysError Signature) :: Constraint) => AtLeastOneUniqueKey Signature Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Signature -> NonEmpty (Unique Signature)

(TypeError (NoUniqueKeysError Signature) :: Constraint) => OnlyOneUniqueKey Signature Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Signature -> Unique Signature

PersistFieldSql Signature Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Signature -> SqlType

(PersistQuery backend, PersistEntityBackend Signature ~ BaseBackend backend) => DeleteCascade Signature backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Signature -> ReaderT backend m ()

ToBackendKey SqlBackend Signature Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Signature -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Signature

Eq (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Signature -> Key Signature -> Bool

(/=) :: Key Signature -> Key Signature -> Bool

Ord (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Signature -> Key Signature -> Ordering

(<) :: Key Signature -> Key Signature -> Bool

(<=) :: Key Signature -> Key Signature -> Bool

(>) :: Key Signature -> Key Signature -> Bool

(>=) :: Key Signature -> Key Signature -> Bool

max :: Key Signature -> Key Signature -> Key Signature

min :: Key Signature -> Key Signature -> Key Signature

Read (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Signature)

readList :: ReadS [Key Signature]

readPrec :: ReadPrec (Key Signature)

readListPrec :: ReadPrec [Key Signature]

Show (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Signature -> ShowS

show :: Key Signature -> String

showList :: [Key Signature] -> ShowS

FromJSON (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Signature)

parseJSONList :: Value -> Parser [Key Signature]

ToJSON (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Signature -> Value

toEncoding :: Key Signature -> Encoding

toJSONList :: [Key Signature] -> Value

toEncodingList :: [Key Signature] -> Encoding

PersistField (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Signature -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Signature)

PersistFieldSql (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Signature) -> SqlType

FromHttpApiData (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Signature)

parseHeader :: ByteString -> Either Text (Key Signature)

parseQueryParam :: Text -> Either Text (Key Signature)

PathPiece (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Signature)

toPathPiece :: Key Signature -> Text

ToHttpApiData (Key Signature) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Signature -> Text

toEncodedUrlPiece :: Key Signature -> Builder

toHeader :: Key Signature -> ByteString

toQueryParam :: Key Signature -> Text

data EntityField Signature typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Signature typ
newtype Key Signature Source # 
Instance details

Defined in Persistence.Schema

newtype Key Signature = SignatureKey {}
type PersistEntityBackend Signature Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Signature = SqlBackend
data Unique Signature Source # 
Instance details

Defined in Persistence.Schema

data Unique Signature

data SignatureMorphism Source #

Instances

Instances details
Show SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SignatureMorphism -> ShowS

show :: SignatureMorphism -> String

showList :: [SignatureMorphism] -> ShowS

PersistEntity SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SignatureMorphism

data Key SignatureMorphism

data EntityField SignatureMorphism :: Type -> Type

data Unique SignatureMorphism

Methods

keyToValues :: Key SignatureMorphism -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SignatureMorphism)

persistIdField :: EntityField SignatureMorphism (Key SignatureMorphism)

entityDef :: Monad m => m SignatureMorphism -> EntityDef

persistFieldDef :: EntityField SignatureMorphism typ -> FieldDef

toPersistFields :: SignatureMorphism -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SignatureMorphism

persistUniqueKeys :: SignatureMorphism -> [Unique SignatureMorphism]

persistUniqueToFieldNames :: Unique SignatureMorphism -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SignatureMorphism -> [PersistValue]

fieldLens :: EntityField SignatureMorphism field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SignatureMorphism -> f (Entity SignatureMorphism)

PersistField SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SignatureMorphism -> PersistValue

fromPersistValue :: PersistValue -> Either Text SignatureMorphism

(TypeError (MultipleUniqueKeysError SignatureMorphism) :: Constraint) => AtLeastOneUniqueKey SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: SignatureMorphism -> NonEmpty (Unique SignatureMorphism)

(TypeError (NoUniqueKeysError SignatureMorphism) :: Constraint) => OnlyOneUniqueKey SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SignatureMorphism -> SqlType

(PersistQuery backend, PersistEntityBackend SignatureMorphism ~ BaseBackend backend) => DeleteCascade SignatureMorphism backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SignatureMorphism -> ReaderT backend m ()

ToBackendKey SqlBackend SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key SignatureMorphism -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key SignatureMorphism

Eq (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key SignatureMorphism -> Key SignatureMorphism -> Bool

(/=) :: Key SignatureMorphism -> Key SignatureMorphism -> Bool

Ord (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Read (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SignatureMorphism)

readList :: ReadS [Key SignatureMorphism]

readPrec :: ReadPrec (Key SignatureMorphism)

readListPrec :: ReadPrec [Key SignatureMorphism]

Show (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SignatureMorphism -> ShowS

show :: Key SignatureMorphism -> String

showList :: [Key SignatureMorphism] -> ShowS

FromJSON (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SignatureMorphism)

parseJSONList :: Value -> Parser [Key SignatureMorphism]

ToJSON (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SignatureMorphism -> Value

toEncoding :: Key SignatureMorphism -> Encoding

toJSONList :: [Key SignatureMorphism] -> Value

toEncodingList :: [Key SignatureMorphism] -> Encoding

PersistField (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SignatureMorphism -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SignatureMorphism)

PersistFieldSql (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SignatureMorphism) -> SqlType

FromHttpApiData (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key SignatureMorphism)

parseHeader :: ByteString -> Either Text (Key SignatureMorphism)

parseQueryParam :: Text -> Either Text (Key SignatureMorphism)

PathPiece (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key SignatureMorphism)

toPathPiece :: Key SignatureMorphism -> Text

ToHttpApiData (Key SignatureMorphism) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key SignatureMorphism -> Text

toEncodedUrlPiece :: Key SignatureMorphism -> Builder

toHeader :: Key SignatureMorphism -> ByteString

toQueryParam :: Key SignatureMorphism -> Text

data EntityField SignatureMorphism typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

newtype Key SignatureMorphism = SignatureMorphismKey {}
type PersistEntityBackend SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SignatureMorphism = SqlBackend
data Unique SignatureMorphism Source # 
Instance details

Defined in Persistence.Schema

data Unique SignatureMorphism

data ConservativityStatus Source #

Instances

Instances details
Show ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> ConservativityStatus -> ShowS

show :: ConservativityStatus -> String

showList :: [ConservativityStatus] -> ShowS

PersistEntity ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ConservativityStatus

data Key ConservativityStatus

data EntityField ConservativityStatus :: Type -> Type

data Unique ConservativityStatus

Methods

keyToValues :: Key ConservativityStatus -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ConservativityStatus)

persistIdField :: EntityField ConservativityStatus (Key ConservativityStatus)

entityDef :: Monad m => m ConservativityStatus -> EntityDef

persistFieldDef :: EntityField ConservativityStatus typ -> FieldDef

toPersistFields :: ConservativityStatus -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ConservativityStatus

persistUniqueKeys :: ConservativityStatus -> [Unique ConservativityStatus]

persistUniqueToFieldNames :: Unique ConservativityStatus -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ConservativityStatus -> [PersistValue]

fieldLens :: EntityField ConservativityStatus field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ConservativityStatus -> f (Entity ConservativityStatus)

PersistField ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ConservativityStatus -> PersistValue

fromPersistValue :: PersistValue -> Either Text ConservativityStatus

(TypeError (MultipleUniqueKeysError ConservativityStatus) :: Constraint) => AtLeastOneUniqueKey ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError ConservativityStatus) :: Constraint) => OnlyOneUniqueKey ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ConservativityStatus -> SqlType

(PersistQuery backend, PersistEntityBackend ConservativityStatus ~ BaseBackend backend) => DeleteCascade ConservativityStatus backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ConservativityStatus -> ReaderT backend m ()

ToBackendKey SqlBackend ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ConservativityStatus -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ConservativityStatus

Eq (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ConservativityStatus)

readList :: ReadS [Key ConservativityStatus]

readPrec :: ReadPrec (Key ConservativityStatus)

readListPrec :: ReadPrec [Key ConservativityStatus]

Show (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ConservativityStatus -> ShowS

show :: Key ConservativityStatus -> String

showList :: [Key ConservativityStatus] -> ShowS

FromJSON (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ConservativityStatus)

parseJSONList :: Value -> Parser [Key ConservativityStatus]

ToJSON (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key ConservativityStatus -> Value

toEncoding :: Key ConservativityStatus -> Encoding

toJSONList :: [Key ConservativityStatus] -> Value

toEncodingList :: [Key ConservativityStatus] -> Encoding

PersistField (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ConservativityStatus -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ConservativityStatus)

PersistFieldSql (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ConservativityStatus) -> SqlType

FromHttpApiData (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ConservativityStatus)

parseHeader :: ByteString -> Either Text (Key ConservativityStatus)

parseQueryParam :: Text -> Either Text (Key ConservativityStatus)

PathPiece (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ConservativityStatus)

toPathPiece :: Key ConservativityStatus -> Text

ToHttpApiData (Key ConservativityStatus) Source # 
Instance details

Defined in Persistence.Schema

data EntityField ConservativityStatus typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ConservativityStatus = SqlBackend
data Unique ConservativityStatus Source # 
Instance details

Defined in Persistence.Schema

data OrganizationalUnit Source #

Constructors

OrganizationalUnit 

Fields

Instances

Instances details
Show OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> OrganizationalUnit -> ShowS

show :: OrganizationalUnit -> String

showList :: [OrganizationalUnit] -> ShowS

PersistEntity OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend OrganizationalUnit

data Key OrganizationalUnit

data EntityField OrganizationalUnit :: Type -> Type

data Unique OrganizationalUnit

Methods

keyToValues :: Key OrganizationalUnit -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key OrganizationalUnit)

persistIdField :: EntityField OrganizationalUnit (Key OrganizationalUnit)

entityDef :: Monad m => m OrganizationalUnit -> EntityDef

persistFieldDef :: EntityField OrganizationalUnit typ -> FieldDef

toPersistFields :: OrganizationalUnit -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text OrganizationalUnit

persistUniqueKeys :: OrganizationalUnit -> [Unique OrganizationalUnit]

persistUniqueToFieldNames :: Unique OrganizationalUnit -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique OrganizationalUnit -> [PersistValue]

fieldLens :: EntityField OrganizationalUnit field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity OrganizationalUnit -> f (Entity OrganizationalUnit)

PersistField OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: OrganizationalUnit -> PersistValue

fromPersistValue :: PersistValue -> Either Text OrganizationalUnit

AtLeastOneUniqueKey OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

OnlyOneUniqueKey OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy OrganizationalUnit -> SqlType

(PersistQuery backend, PersistEntityBackend OrganizationalUnit ~ BaseBackend backend) => DeleteCascade OrganizationalUnit backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key OrganizationalUnit -> ReaderT backend m ()

ToBackendKey SqlBackend OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key OrganizationalUnit -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key OrganizationalUnit

Eq (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key OrganizationalUnit -> Key OrganizationalUnit -> Bool

(/=) :: Key OrganizationalUnit -> Key OrganizationalUnit -> Bool

Ord (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Read (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key OrganizationalUnit)

readList :: ReadS [Key OrganizationalUnit]

readPrec :: ReadPrec (Key OrganizationalUnit)

readListPrec :: ReadPrec [Key OrganizationalUnit]

Show (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key OrganizationalUnit -> ShowS

show :: Key OrganizationalUnit -> String

showList :: [Key OrganizationalUnit] -> ShowS

Show (Unique OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique OrganizationalUnit -> ShowS

show :: Unique OrganizationalUnit -> String

showList :: [Unique OrganizationalUnit] -> ShowS

FromJSON (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key OrganizationalUnit)

parseJSONList :: Value -> Parser [Key OrganizationalUnit]

ToJSON (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key OrganizationalUnit -> Value

toEncoding :: Key OrganizationalUnit -> Encoding

toJSONList :: [Key OrganizationalUnit] -> Value

toEncodingList :: [Key OrganizationalUnit] -> Encoding

PersistField (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key OrganizationalUnit -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key OrganizationalUnit)

PersistFieldSql (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key OrganizationalUnit) -> SqlType

FromHttpApiData (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key OrganizationalUnit)

parseHeader :: ByteString -> Either Text (Key OrganizationalUnit)

parseQueryParam :: Text -> Either Text (Key OrganizationalUnit)

PathPiece (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key OrganizationalUnit)

toPathPiece :: Key OrganizationalUnit -> Text

ToHttpApiData (Key OrganizationalUnit) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key OrganizationalUnit -> Text

toEncodedUrlPiece :: Key OrganizationalUnit -> Builder

toHeader :: Key OrganizationalUnit -> ByteString

toQueryParam :: Key OrganizationalUnit -> Text

data EntityField OrganizationalUnit typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField OrganizationalUnit typ
newtype Key OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

newtype Key OrganizationalUnit = OrganizationalUnitKey {}
type PersistEntityBackend OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend OrganizationalUnit = SqlBackend
data Unique OrganizationalUnit Source # 
Instance details

Defined in Persistence.Schema

data Repository Source #

Constructors

Repository 

Instances

Instances details
Show Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Repository -> ShowS

show :: Repository -> String

showList :: [Repository] -> ShowS

PersistEntity Repository Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Repository

data Key Repository

data EntityField Repository :: Type -> Type

data Unique Repository

Methods

keyToValues :: Key Repository -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Repository)

persistIdField :: EntityField Repository (Key Repository)

entityDef :: Monad m => m Repository -> EntityDef

persistFieldDef :: EntityField Repository typ -> FieldDef

toPersistFields :: Repository -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Repository

persistUniqueKeys :: Repository -> [Unique Repository]

persistUniqueToFieldNames :: Unique Repository -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Repository -> [PersistValue]

fieldLens :: EntityField Repository field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Repository -> f (Entity Repository)

PersistField Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Repository -> PersistValue

fromPersistValue :: PersistValue -> Either Text Repository

(TypeError (MultipleUniqueKeysError Repository) :: Constraint) => AtLeastOneUniqueKey Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Repository -> NonEmpty (Unique Repository)

(TypeError (NoUniqueKeysError Repository) :: Constraint) => OnlyOneUniqueKey Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Repository -> Unique Repository

PersistFieldSql Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Repository -> SqlType

(PersistQuery backend, PersistEntityBackend Repository ~ BaseBackend backend) => DeleteCascade Repository backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Repository -> ReaderT backend m ()

ToBackendKey SqlBackend Repository Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Repository -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Repository

Eq (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Repository -> Key Repository -> Bool

(/=) :: Key Repository -> Key Repository -> Bool

Ord (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Repository -> Key Repository -> Ordering

(<) :: Key Repository -> Key Repository -> Bool

(<=) :: Key Repository -> Key Repository -> Bool

(>) :: Key Repository -> Key Repository -> Bool

(>=) :: Key Repository -> Key Repository -> Bool

max :: Key Repository -> Key Repository -> Key Repository

min :: Key Repository -> Key Repository -> Key Repository

Read (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Repository)

readList :: ReadS [Key Repository]

readPrec :: ReadPrec (Key Repository)

readListPrec :: ReadPrec [Key Repository]

Show (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Repository -> ShowS

show :: Key Repository -> String

showList :: [Key Repository] -> ShowS

FromJSON (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Repository)

parseJSONList :: Value -> Parser [Key Repository]

ToJSON (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Repository -> Value

toEncoding :: Key Repository -> Encoding

toJSONList :: [Key Repository] -> Value

toEncodingList :: [Key Repository] -> Encoding

PersistField (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Repository -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Repository)

PersistFieldSql (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Repository) -> SqlType

FromHttpApiData (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Repository)

parseHeader :: ByteString -> Either Text (Key Repository)

parseQueryParam :: Text -> Either Text (Key Repository)

PathPiece (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Repository)

toPathPiece :: Key Repository -> Text

ToHttpApiData (Key Repository) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Repository -> Text

toEncodedUrlPiece :: Key Repository -> Builder

toHeader :: Key Repository -> ByteString

toQueryParam :: Key Repository -> Text

data EntityField Repository typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Repository typ
newtype Key Repository Source # 
Instance details

Defined in Persistence.Schema

newtype Key Repository = RepositoryKey {}
type PersistEntityBackend Repository Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Repository = SqlBackend
data Unique Repository Source # 
Instance details

Defined in Persistence.Schema

data Unique Repository

data Action Source #

Constructors

Action 

Instances

Instances details
Show Action Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Action -> ShowS

show :: Action -> String

showList :: [Action] -> ShowS

PersistEntity Action Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Action

data Key Action

data EntityField Action :: Type -> Type

data Unique Action

Methods

keyToValues :: Key Action -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Action)

persistIdField :: EntityField Action (Key Action)

entityDef :: Monad m => m Action -> EntityDef

persistFieldDef :: EntityField Action typ -> FieldDef

toPersistFields :: Action -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Action

persistUniqueKeys :: Action -> [Unique Action]

persistUniqueToFieldNames :: Unique Action -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Action -> [PersistValue]

fieldLens :: EntityField Action field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Action -> f (Entity Action)

PersistField Action Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Action -> PersistValue

fromPersistValue :: PersistValue -> Either Text Action

(TypeError (MultipleUniqueKeysError Action) :: Constraint) => AtLeastOneUniqueKey Action Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Action -> NonEmpty (Unique Action)

(TypeError (NoUniqueKeysError Action) :: Constraint) => OnlyOneUniqueKey Action Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Action -> Unique Action

PersistFieldSql Action Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Action -> SqlType

(PersistQuery backend, PersistEntityBackend Action ~ BaseBackend backend) => DeleteCascade Action backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Action -> ReaderT backend m ()

ToBackendKey SqlBackend Action Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Action -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Action

Eq (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Action -> Key Action -> Bool

(/=) :: Key Action -> Key Action -> Bool

Ord (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Action -> Key Action -> Ordering

(<) :: Key Action -> Key Action -> Bool

(<=) :: Key Action -> Key Action -> Bool

(>) :: Key Action -> Key Action -> Bool

(>=) :: Key Action -> Key Action -> Bool

max :: Key Action -> Key Action -> Key Action

min :: Key Action -> Key Action -> Key Action

Read (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Action)

readList :: ReadS [Key Action]

readPrec :: ReadPrec (Key Action)

readListPrec :: ReadPrec [Key Action]

Show (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Action -> ShowS

show :: Key Action -> String

showList :: [Key Action] -> ShowS

FromJSON (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Action)

parseJSONList :: Value -> Parser [Key Action]

ToJSON (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Action -> Value

toEncoding :: Key Action -> Encoding

toJSONList :: [Key Action] -> Value

toEncodingList :: [Key Action] -> Encoding

PersistField (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Action -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Action)

PersistFieldSql (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Action) -> SqlType

FromHttpApiData (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Action)

parseHeader :: ByteString -> Either Text (Key Action)

parseQueryParam :: Text -> Either Text (Key Action)

PathPiece (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Action)

toPathPiece :: Key Action -> Text

ToHttpApiData (Key Action) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Action -> Text

toEncodedUrlPiece :: Key Action -> Builder

toHeader :: Key Action -> ByteString

toQueryParam :: Key Action -> Text

data EntityField Action typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Action typ
newtype Key Action Source # 
Instance details

Defined in Persistence.Schema

newtype Key Action = ActionKey {}
type PersistEntityBackend Action Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Action = SqlBackend
data Unique Action Source # 
Instance details

Defined in Persistence.Schema

data Unique Action

type ActionId = Key Action Source #

data FileVersion Source #

Constructors

FileVersion 

Instances

Instances details
Show FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> FileVersion -> ShowS

show :: FileVersion -> String

showList :: [FileVersion] -> ShowS

PersistEntity FileVersion Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend FileVersion

data Key FileVersion

data EntityField FileVersion :: Type -> Type

data Unique FileVersion

Methods

keyToValues :: Key FileVersion -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key FileVersion)

persistIdField :: EntityField FileVersion (Key FileVersion)

entityDef :: Monad m => m FileVersion -> EntityDef

persistFieldDef :: EntityField FileVersion typ -> FieldDef

toPersistFields :: FileVersion -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text FileVersion

persistUniqueKeys :: FileVersion -> [Unique FileVersion]

persistUniqueToFieldNames :: Unique FileVersion -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique FileVersion -> [PersistValue]

fieldLens :: EntityField FileVersion field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity FileVersion -> f (Entity FileVersion)

PersistField FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: FileVersion -> PersistValue

fromPersistValue :: PersistValue -> Either Text FileVersion

(TypeError (MultipleUniqueKeysError FileVersion) :: Constraint) => AtLeastOneUniqueKey FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: FileVersion -> NonEmpty (Unique FileVersion)

(TypeError (NoUniqueKeysError FileVersion) :: Constraint) => OnlyOneUniqueKey FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: FileVersion -> Unique FileVersion

PersistFieldSql FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy FileVersion -> SqlType

(PersistQuery backend, PersistEntityBackend FileVersion ~ BaseBackend backend) => DeleteCascade FileVersion backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key FileVersion -> ReaderT backend m ()

ToBackendKey SqlBackend FileVersion Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key FileVersion -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key FileVersion

Eq (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key FileVersion -> Key FileVersion -> Bool

(/=) :: Key FileVersion -> Key FileVersion -> Bool

Ord (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key FileVersion -> Key FileVersion -> Ordering

(<) :: Key FileVersion -> Key FileVersion -> Bool

(<=) :: Key FileVersion -> Key FileVersion -> Bool

(>) :: Key FileVersion -> Key FileVersion -> Bool

(>=) :: Key FileVersion -> Key FileVersion -> Bool

max :: Key FileVersion -> Key FileVersion -> Key FileVersion

min :: Key FileVersion -> Key FileVersion -> Key FileVersion

Read (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key FileVersion)

readList :: ReadS [Key FileVersion]

readPrec :: ReadPrec (Key FileVersion)

readListPrec :: ReadPrec [Key FileVersion]

Show (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key FileVersion -> ShowS

show :: Key FileVersion -> String

showList :: [Key FileVersion] -> ShowS

FromJSON (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key FileVersion)

parseJSONList :: Value -> Parser [Key FileVersion]

ToJSON (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key FileVersion -> Value

toEncoding :: Key FileVersion -> Encoding

toJSONList :: [Key FileVersion] -> Value

toEncodingList :: [Key FileVersion] -> Encoding

PersistField (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key FileVersion -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key FileVersion)

PersistFieldSql (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key FileVersion) -> SqlType

FromHttpApiData (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key FileVersion)

parseHeader :: ByteString -> Either Text (Key FileVersion)

parseQueryParam :: Text -> Either Text (Key FileVersion)

PathPiece (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key FileVersion)

toPathPiece :: Key FileVersion -> Text

ToHttpApiData (Key FileVersion) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key FileVersion -> Text

toEncodedUrlPiece :: Key FileVersion -> Builder

toHeader :: Key FileVersion -> ByteString

toQueryParam :: Key FileVersion -> Text

data EntityField FileVersion typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField FileVersion typ
newtype Key FileVersion Source # 
Instance details

Defined in Persistence.Schema

newtype Key FileVersion = FileVersionKey {}
type PersistEntityBackend FileVersion Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend FileVersion = SqlBackend
data Unique FileVersion Source # 
Instance details

Defined in Persistence.Schema

data Unique FileVersion

data FileVersionParent Source #

Instances

Instances details
Show FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> FileVersionParent -> ShowS

show :: FileVersionParent -> String

showList :: [FileVersionParent] -> ShowS

PersistEntity FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend FileVersionParent

data Key FileVersionParent

data EntityField FileVersionParent :: Type -> Type

data Unique FileVersionParent

Methods

keyToValues :: Key FileVersionParent -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key FileVersionParent)

persistIdField :: EntityField FileVersionParent (Key FileVersionParent)

entityDef :: Monad m => m FileVersionParent -> EntityDef

persistFieldDef :: EntityField FileVersionParent typ -> FieldDef

toPersistFields :: FileVersionParent -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text FileVersionParent

persistUniqueKeys :: FileVersionParent -> [Unique FileVersionParent]

persistUniqueToFieldNames :: Unique FileVersionParent -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique FileVersionParent -> [PersistValue]

fieldLens :: EntityField FileVersionParent field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity FileVersionParent -> f (Entity FileVersionParent)

PersistField FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: FileVersionParent -> PersistValue

fromPersistValue :: PersistValue -> Either Text FileVersionParent

(TypeError (MultipleUniqueKeysError FileVersionParent) :: Constraint) => AtLeastOneUniqueKey FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: FileVersionParent -> NonEmpty (Unique FileVersionParent)

(TypeError (NoUniqueKeysError FileVersionParent) :: Constraint) => OnlyOneUniqueKey FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy FileVersionParent -> SqlType

(PersistQuery backend, PersistEntityBackend FileVersionParent ~ BaseBackend backend) => DeleteCascade FileVersionParent backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key FileVersionParent -> ReaderT backend m ()

Eq (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key FileVersionParent -> Key FileVersionParent -> Bool

(/=) :: Key FileVersionParent -> Key FileVersionParent -> Bool

Ord (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Read (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key FileVersionParent)

readList :: ReadS [Key FileVersionParent]

readPrec :: ReadPrec (Key FileVersionParent)

readListPrec :: ReadPrec [Key FileVersionParent]

Show (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key FileVersionParent -> ShowS

show :: Key FileVersionParent -> String

showList :: [Key FileVersionParent] -> ShowS

Generic (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type Rep (Key FileVersionParent) :: Type -> Type

Methods

from :: Key FileVersionParent -> Rep (Key FileVersionParent) x

to :: Rep (Key FileVersionParent) x -> Key FileVersionParent

FromJSON (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key FileVersionParent)

parseJSONList :: Value -> Parser [Key FileVersionParent]

ToJSON (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key FileVersionParent -> Value

toEncoding :: Key FileVersionParent -> Encoding

toJSONList :: [Key FileVersionParent] -> Value

toEncodingList :: [Key FileVersionParent] -> Encoding

PersistField (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key FileVersionParent -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key FileVersionParent)

PersistFieldSql (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key FileVersionParent) -> SqlType

data EntityField FileVersionParent typ Source # 
Instance details

Defined in Persistence.Schema

data Key FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend FileVersionParent = SqlBackend
data Unique FileVersionParent Source # 
Instance details

Defined in Persistence.Schema

data Unique FileVersionParent
type Rep (Key FileVersionParent) Source # 
Instance details

Defined in Persistence.Schema

type Rep (Key FileVersionParent) = D1 ('MetaData "Key" "Persistence.Schema" "main" 'False) (C1 ('MetaCons "FileVersionParentKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "fileVersionParentKeylastChangedFileVersionId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FileVersionId) :*: S1 ('MetaSel ('Just "fileVersionParentKeyqueriedSha") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 String)))

data LocIdBase Source #

Instances

Instances details
Show LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> LocIdBase -> ShowS

show :: LocIdBase -> String

showList :: [LocIdBase] -> ShowS

PersistEntity LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend LocIdBase

data Key LocIdBase

data EntityField LocIdBase :: Type -> Type

data Unique LocIdBase

Methods

keyToValues :: Key LocIdBase -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key LocIdBase)

persistIdField :: EntityField LocIdBase (Key LocIdBase)

entityDef :: Monad m => m LocIdBase -> EntityDef

persistFieldDef :: EntityField LocIdBase typ -> FieldDef

toPersistFields :: LocIdBase -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text LocIdBase

persistUniqueKeys :: LocIdBase -> [Unique LocIdBase]

persistUniqueToFieldNames :: Unique LocIdBase -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique LocIdBase -> [PersistValue]

fieldLens :: EntityField LocIdBase field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity LocIdBase -> f (Entity LocIdBase)

PersistField LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: LocIdBase -> PersistValue

fromPersistValue :: PersistValue -> Either Text LocIdBase

AtLeastOneUniqueKey LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: LocIdBase -> NonEmpty (Unique LocIdBase)

OnlyOneUniqueKey LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: LocIdBase -> Unique LocIdBase

PersistFieldSql LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy LocIdBase -> SqlType

(PersistQuery backend, PersistEntityBackend LocIdBase ~ BaseBackend backend) => DeleteCascade LocIdBase backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key LocIdBase -> ReaderT backend m ()

ToBackendKey SqlBackend LocIdBase Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key LocIdBase -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key LocIdBase

Eq (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key LocIdBase -> Key LocIdBase -> Bool

(/=) :: Key LocIdBase -> Key LocIdBase -> Bool

Ord (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key LocIdBase -> Key LocIdBase -> Ordering

(<) :: Key LocIdBase -> Key LocIdBase -> Bool

(<=) :: Key LocIdBase -> Key LocIdBase -> Bool

(>) :: Key LocIdBase -> Key LocIdBase -> Bool

(>=) :: Key LocIdBase -> Key LocIdBase -> Bool

max :: Key LocIdBase -> Key LocIdBase -> Key LocIdBase

min :: Key LocIdBase -> Key LocIdBase -> Key LocIdBase

Read (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key LocIdBase)

readList :: ReadS [Key LocIdBase]

readPrec :: ReadPrec (Key LocIdBase)

readListPrec :: ReadPrec [Key LocIdBase]

Show (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key LocIdBase -> ShowS

show :: Key LocIdBase -> String

showList :: [Key LocIdBase] -> ShowS

Show (Unique LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique LocIdBase -> ShowS

show :: Unique LocIdBase -> String

showList :: [Unique LocIdBase] -> ShowS

FromJSON (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key LocIdBase)

parseJSONList :: Value -> Parser [Key LocIdBase]

ToJSON (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key LocIdBase -> Value

toEncoding :: Key LocIdBase -> Encoding

toJSONList :: [Key LocIdBase] -> Value

toEncodingList :: [Key LocIdBase] -> Encoding

PersistField (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key LocIdBase -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key LocIdBase)

PersistFieldSql (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key LocIdBase) -> SqlType

FromHttpApiData (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key LocIdBase)

parseHeader :: ByteString -> Either Text (Key LocIdBase)

parseQueryParam :: Text -> Either Text (Key LocIdBase)

PathPiece (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key LocIdBase)

toPathPiece :: Key LocIdBase -> Text

ToHttpApiData (Key LocIdBase) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key LocIdBase -> Text

toEncodedUrlPiece :: Key LocIdBase -> Builder

toHeader :: Key LocIdBase -> ByteString

toQueryParam :: Key LocIdBase -> Text

data EntityField LocIdBase typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField LocIdBase typ
newtype Key LocIdBase Source # 
Instance details

Defined in Persistence.Schema

newtype Key LocIdBase = LocIdBaseKey {}
type PersistEntityBackend LocIdBase Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend LocIdBase = SqlBackend
data Unique LocIdBase Source # 
Instance details

Defined in Persistence.Schema

data Document Source #

Constructors

Document 

Fields

Instances

Instances details
Show Document Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Document -> ShowS

show :: Document -> String

showList :: [Document] -> ShowS

PersistEntity Document Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Document

data Key Document

data EntityField Document :: Type -> Type

data Unique Document

Methods

keyToValues :: Key Document -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Document)

persistIdField :: EntityField Document (Key Document)

entityDef :: Monad m => m Document -> EntityDef

persistFieldDef :: EntityField Document typ -> FieldDef

toPersistFields :: Document -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Document

persistUniqueKeys :: Document -> [Unique Document]

persistUniqueToFieldNames :: Unique Document -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Document -> [PersistValue]

fieldLens :: EntityField Document field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Document -> f (Entity Document)

PersistField Document Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Document -> PersistValue

fromPersistValue :: PersistValue -> Either Text Document

(TypeError (MultipleUniqueKeysError Document) :: Constraint) => AtLeastOneUniqueKey Document Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Document -> NonEmpty (Unique Document)

(TypeError (NoUniqueKeysError Document) :: Constraint) => OnlyOneUniqueKey Document Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Document -> Unique Document

PersistFieldSql Document Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Document -> SqlType

(PersistQuery backend, PersistEntityBackend Document ~ BaseBackend backend) => DeleteCascade Document backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Document -> ReaderT backend m ()

ToBackendKey SqlBackend Document Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Document -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Document

Eq (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Document -> Key Document -> Bool

(/=) :: Key Document -> Key Document -> Bool

Ord (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Document -> Key Document -> Ordering

(<) :: Key Document -> Key Document -> Bool

(<=) :: Key Document -> Key Document -> Bool

(>) :: Key Document -> Key Document -> Bool

(>=) :: Key Document -> Key Document -> Bool

max :: Key Document -> Key Document -> Key Document

min :: Key Document -> Key Document -> Key Document

Read (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Document)

readList :: ReadS [Key Document]

readPrec :: ReadPrec (Key Document)

readListPrec :: ReadPrec [Key Document]

Show (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Document -> ShowS

show :: Key Document -> String

showList :: [Key Document] -> ShowS

FromJSON (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Document)

parseJSONList :: Value -> Parser [Key Document]

ToJSON (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Document -> Value

toEncoding :: Key Document -> Encoding

toJSONList :: [Key Document] -> Value

toEncodingList :: [Key Document] -> Encoding

PersistField (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Document -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Document)

PersistFieldSql (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Document) -> SqlType

FromHttpApiData (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Document)

parseHeader :: ByteString -> Either Text (Key Document)

parseQueryParam :: Text -> Either Text (Key Document)

PathPiece (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Document)

toPathPiece :: Key Document -> Text

ToHttpApiData (Key Document) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Document -> Text

toEncodedUrlPiece :: Key Document -> Builder

toHeader :: Key Document -> ByteString

toQueryParam :: Key Document -> Text

data EntityField Document typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Document typ
newtype Key Document Source # 
Instance details

Defined in Persistence.Schema

newtype Key Document = DocumentKey {}
type PersistEntityBackend Document Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Document = SqlBackend
data Unique Document Source # 
Instance details

Defined in Persistence.Schema

data Unique Document

data DocumentLink Source #

Instances

data FileRange Source #

Constructors

FileRange 

Fields

Instances

Instances details
Show FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> FileRange -> ShowS

show :: FileRange -> String

showList :: [FileRange] -> ShowS

PersistEntity FileRange Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend FileRange

data Key FileRange

data EntityField FileRange :: Type -> Type

data Unique FileRange

Methods

keyToValues :: Key FileRange -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key FileRange)

persistIdField :: EntityField FileRange (Key FileRange)

entityDef :: Monad m => m FileRange -> EntityDef

persistFieldDef :: EntityField FileRange typ -> FieldDef

toPersistFields :: FileRange -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text FileRange

persistUniqueKeys :: FileRange -> [Unique FileRange]

persistUniqueToFieldNames :: Unique FileRange -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique FileRange -> [PersistValue]

fieldLens :: EntityField FileRange field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity FileRange -> f (Entity FileRange)

PersistField FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: FileRange -> PersistValue

fromPersistValue :: PersistValue -> Either Text FileRange

(TypeError (MultipleUniqueKeysError FileRange) :: Constraint) => AtLeastOneUniqueKey FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: FileRange -> NonEmpty (Unique FileRange)

(TypeError (NoUniqueKeysError FileRange) :: Constraint) => OnlyOneUniqueKey FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: FileRange -> Unique FileRange

PersistFieldSql FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy FileRange -> SqlType

(PersistQuery backend, PersistEntityBackend FileRange ~ BaseBackend backend) => DeleteCascade FileRange backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key FileRange -> ReaderT backend m ()

ToBackendKey SqlBackend FileRange Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key FileRange -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key FileRange

Eq (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key FileRange -> Key FileRange -> Bool

(/=) :: Key FileRange -> Key FileRange -> Bool

Ord (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key FileRange -> Key FileRange -> Ordering

(<) :: Key FileRange -> Key FileRange -> Bool

(<=) :: Key FileRange -> Key FileRange -> Bool

(>) :: Key FileRange -> Key FileRange -> Bool

(>=) :: Key FileRange -> Key FileRange -> Bool

max :: Key FileRange -> Key FileRange -> Key FileRange

min :: Key FileRange -> Key FileRange -> Key FileRange

Read (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key FileRange)

readList :: ReadS [Key FileRange]

readPrec :: ReadPrec (Key FileRange)

readListPrec :: ReadPrec [Key FileRange]

Show (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key FileRange -> ShowS

show :: Key FileRange -> String

showList :: [Key FileRange] -> ShowS

FromJSON (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key FileRange)

parseJSONList :: Value -> Parser [Key FileRange]

ToJSON (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key FileRange -> Value

toEncoding :: Key FileRange -> Encoding

toJSONList :: [Key FileRange] -> Value

toEncodingList :: [Key FileRange] -> Encoding

PersistField (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key FileRange -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key FileRange)

PersistFieldSql (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key FileRange) -> SqlType

FromHttpApiData (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key FileRange)

parseHeader :: ByteString -> Either Text (Key FileRange)

parseQueryParam :: Text -> Either Text (Key FileRange)

PathPiece (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key FileRange)

toPathPiece :: Key FileRange -> Text

ToHttpApiData (Key FileRange) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key FileRange -> Text

toEncodedUrlPiece :: Key FileRange -> Builder

toHeader :: Key FileRange -> ByteString

toQueryParam :: Key FileRange -> Text

data EntityField FileRange typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField FileRange typ
newtype Key FileRange Source # 
Instance details

Defined in Persistence.Schema

newtype Key FileRange = FileRangeKey {}
type PersistEntityBackend FileRange Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend FileRange = SqlBackend
data Unique FileRange Source # 
Instance details

Defined in Persistence.Schema

data Unique FileRange

data Diagnosis Source #

Instances

Instances details
Show Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Diagnosis -> ShowS

show :: Diagnosis -> String

showList :: [Diagnosis] -> ShowS

PersistEntity Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Diagnosis

data Key Diagnosis

data EntityField Diagnosis :: Type -> Type

data Unique Diagnosis

Methods

keyToValues :: Key Diagnosis -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Diagnosis)

persistIdField :: EntityField Diagnosis (Key Diagnosis)

entityDef :: Monad m => m Diagnosis -> EntityDef

persistFieldDef :: EntityField Diagnosis typ -> FieldDef

toPersistFields :: Diagnosis -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Diagnosis

persistUniqueKeys :: Diagnosis -> [Unique Diagnosis]

persistUniqueToFieldNames :: Unique Diagnosis -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Diagnosis -> [PersistValue]

fieldLens :: EntityField Diagnosis field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Diagnosis -> f (Entity Diagnosis)

PersistField Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Diagnosis -> PersistValue

fromPersistValue :: PersistValue -> Either Text Diagnosis

(TypeError (MultipleUniqueKeysError Diagnosis) :: Constraint) => AtLeastOneUniqueKey Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Diagnosis -> NonEmpty (Unique Diagnosis)

(TypeError (NoUniqueKeysError Diagnosis) :: Constraint) => OnlyOneUniqueKey Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Diagnosis -> Unique Diagnosis

PersistFieldSql Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Diagnosis -> SqlType

(PersistQuery backend, PersistEntityBackend Diagnosis ~ BaseBackend backend) => DeleteCascade Diagnosis backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Diagnosis -> ReaderT backend m ()

ToBackendKey SqlBackend Diagnosis Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Diagnosis -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Diagnosis

Eq (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Diagnosis -> Key Diagnosis -> Bool

(/=) :: Key Diagnosis -> Key Diagnosis -> Bool

Ord (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Diagnosis -> Key Diagnosis -> Ordering

(<) :: Key Diagnosis -> Key Diagnosis -> Bool

(<=) :: Key Diagnosis -> Key Diagnosis -> Bool

(>) :: Key Diagnosis -> Key Diagnosis -> Bool

(>=) :: Key Diagnosis -> Key Diagnosis -> Bool

max :: Key Diagnosis -> Key Diagnosis -> Key Diagnosis

min :: Key Diagnosis -> Key Diagnosis -> Key Diagnosis

Read (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Diagnosis)

readList :: ReadS [Key Diagnosis]

readPrec :: ReadPrec (Key Diagnosis)

readListPrec :: ReadPrec [Key Diagnosis]

Show (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Diagnosis -> ShowS

show :: Key Diagnosis -> String

showList :: [Key Diagnosis] -> ShowS

FromJSON (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Diagnosis)

parseJSONList :: Value -> Parser [Key Diagnosis]

ToJSON (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Diagnosis -> Value

toEncoding :: Key Diagnosis -> Encoding

toJSONList :: [Key Diagnosis] -> Value

toEncodingList :: [Key Diagnosis] -> Encoding

PersistField (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Diagnosis -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Diagnosis)

PersistFieldSql (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Diagnosis) -> SqlType

FromHttpApiData (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Diagnosis)

parseHeader :: ByteString -> Either Text (Key Diagnosis)

parseQueryParam :: Text -> Either Text (Key Diagnosis)

PathPiece (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Diagnosis)

toPathPiece :: Key Diagnosis -> Text

ToHttpApiData (Key Diagnosis) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Diagnosis -> Text

toEncodedUrlPiece :: Key Diagnosis -> Builder

toHeader :: Key Diagnosis -> ByteString

toQueryParam :: Key Diagnosis -> Text

data EntityField Diagnosis typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Diagnosis typ
newtype Key Diagnosis Source # 
Instance details

Defined in Persistence.Schema

newtype Key Diagnosis = DiagnosisKey {}
type PersistEntityBackend Diagnosis Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Diagnosis = SqlBackend
data Unique Diagnosis Source # 
Instance details

Defined in Persistence.Schema

data Unique Diagnosis

data OMS Source #

Instances

Instances details
Show OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> OMS -> ShowS

show :: OMS -> String

showList :: [OMS] -> ShowS

PersistEntity OMS Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend OMS

data Key OMS

data EntityField OMS :: Type -> Type

data Unique OMS

Methods

keyToValues :: Key OMS -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key OMS)

persistIdField :: EntityField OMS (Key OMS)

entityDef :: Monad m => m OMS -> EntityDef

persistFieldDef :: EntityField OMS typ -> FieldDef

toPersistFields :: OMS -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text OMS

persistUniqueKeys :: OMS -> [Unique OMS]

persistUniqueToFieldNames :: Unique OMS -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique OMS -> [PersistValue]

fieldLens :: EntityField OMS field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity OMS -> f (Entity OMS)

PersistField OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: OMS -> PersistValue

fromPersistValue :: PersistValue -> Either Text OMS

(TypeError (MultipleUniqueKeysError OMS) :: Constraint) => AtLeastOneUniqueKey OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: OMS -> NonEmpty (Unique OMS)

(TypeError (NoUniqueKeysError OMS) :: Constraint) => OnlyOneUniqueKey OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: OMS -> Unique OMS

PersistFieldSql OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy OMS -> SqlType

(PersistQuery backend, PersistEntityBackend OMS ~ BaseBackend backend) => DeleteCascade OMS backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key OMS -> ReaderT backend m ()

ToBackendKey SqlBackend OMS Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key OMS -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key OMS

Eq (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key OMS -> Key OMS -> Bool

(/=) :: Key OMS -> Key OMS -> Bool

Ord (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key OMS -> Key OMS -> Ordering

(<) :: Key OMS -> Key OMS -> Bool

(<=) :: Key OMS -> Key OMS -> Bool

(>) :: Key OMS -> Key OMS -> Bool

(>=) :: Key OMS -> Key OMS -> Bool

max :: Key OMS -> Key OMS -> Key OMS

min :: Key OMS -> Key OMS -> Key OMS

Read (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key OMS)

readList :: ReadS [Key OMS]

readPrec :: ReadPrec (Key OMS)

readListPrec :: ReadPrec [Key OMS]

Show (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key OMS -> ShowS

show :: Key OMS -> String

showList :: [Key OMS] -> ShowS

FromJSON (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key OMS)

parseJSONList :: Value -> Parser [Key OMS]

ToJSON (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key OMS -> Value

toEncoding :: Key OMS -> Encoding

toJSONList :: [Key OMS] -> Value

toEncodingList :: [Key OMS] -> Encoding

PersistField (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key OMS -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key OMS)

PersistFieldSql (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key OMS) -> SqlType

FromHttpApiData (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key OMS)

parseHeader :: ByteString -> Either Text (Key OMS)

parseQueryParam :: Text -> Either Text (Key OMS)

PathPiece (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key OMS)

toPathPiece :: Key OMS -> Text

ToHttpApiData (Key OMS) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key OMS -> Text

toEncodedUrlPiece :: Key OMS -> Builder

toHeader :: Key OMS -> ByteString

toQueryParam :: Key OMS -> Text

data EntityField OMS typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField OMS typ
newtype Key OMS Source # 
Instance details

Defined in Persistence.Schema

newtype Key OMS = OMSKey {}
type PersistEntityBackend OMS Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend OMS = SqlBackend
data Unique OMS Source # 
Instance details

Defined in Persistence.Schema

data Unique OMS

type OMSId = Key OMS Source #

data Mapping Source #

Instances

Instances details
Show Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Mapping -> ShowS

show :: Mapping -> String

showList :: [Mapping] -> ShowS

PersistEntity Mapping Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Mapping

data Key Mapping

data EntityField Mapping :: Type -> Type

data Unique Mapping

Methods

keyToValues :: Key Mapping -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Mapping)

persistIdField :: EntityField Mapping (Key Mapping)

entityDef :: Monad m => m Mapping -> EntityDef

persistFieldDef :: EntityField Mapping typ -> FieldDef

toPersistFields :: Mapping -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Mapping

persistUniqueKeys :: Mapping -> [Unique Mapping]

persistUniqueToFieldNames :: Unique Mapping -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Mapping -> [PersistValue]

fieldLens :: EntityField Mapping field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Mapping -> f (Entity Mapping)

PersistField Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Mapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text Mapping

(TypeError (MultipleUniqueKeysError Mapping) :: Constraint) => AtLeastOneUniqueKey Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Mapping -> NonEmpty (Unique Mapping)

(TypeError (NoUniqueKeysError Mapping) :: Constraint) => OnlyOneUniqueKey Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Mapping -> Unique Mapping

PersistFieldSql Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Mapping -> SqlType

(PersistQuery backend, PersistEntityBackend Mapping ~ BaseBackend backend) => DeleteCascade Mapping backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Mapping -> ReaderT backend m ()

ToBackendKey SqlBackend Mapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Mapping -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Mapping

Eq (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Mapping -> Key Mapping -> Bool

(/=) :: Key Mapping -> Key Mapping -> Bool

Ord (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Mapping -> Key Mapping -> Ordering

(<) :: Key Mapping -> Key Mapping -> Bool

(<=) :: Key Mapping -> Key Mapping -> Bool

(>) :: Key Mapping -> Key Mapping -> Bool

(>=) :: Key Mapping -> Key Mapping -> Bool

max :: Key Mapping -> Key Mapping -> Key Mapping

min :: Key Mapping -> Key Mapping -> Key Mapping

Read (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Mapping)

readList :: ReadS [Key Mapping]

readPrec :: ReadPrec (Key Mapping)

readListPrec :: ReadPrec [Key Mapping]

Show (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Mapping -> ShowS

show :: Key Mapping -> String

showList :: [Key Mapping] -> ShowS

FromJSON (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Mapping)

parseJSONList :: Value -> Parser [Key Mapping]

ToJSON (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Mapping -> Value

toEncoding :: Key Mapping -> Encoding

toJSONList :: [Key Mapping] -> Value

toEncodingList :: [Key Mapping] -> Encoding

PersistField (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Mapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Mapping)

PersistFieldSql (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Mapping) -> SqlType

FromHttpApiData (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Mapping)

parseHeader :: ByteString -> Either Text (Key Mapping)

parseQueryParam :: Text -> Either Text (Key Mapping)

PathPiece (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Mapping)

toPathPiece :: Key Mapping -> Text

ToHttpApiData (Key Mapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Mapping -> Text

toEncodedUrlPiece :: Key Mapping -> Builder

toHeader :: Key Mapping -> ByteString

toQueryParam :: Key Mapping -> Text

data EntityField Mapping typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Mapping typ
newtype Key Mapping Source # 
Instance details

Defined in Persistence.Schema

newtype Key Mapping = MappingKey {}
type PersistEntityBackend Mapping Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Mapping = SqlBackend
data Unique Mapping Source # 
Instance details

Defined in Persistence.Schema

data Unique Mapping

data Sentence Source #

Constructors

Sentence 

Fields

Instances

Instances details
Show Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Sentence -> ShowS

show :: Sentence -> String

showList :: [Sentence] -> ShowS

PersistEntity Sentence Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Sentence

data Key Sentence

data EntityField Sentence :: Type -> Type

data Unique Sentence

Methods

keyToValues :: Key Sentence -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Sentence)

persistIdField :: EntityField Sentence (Key Sentence)

entityDef :: Monad m => m Sentence -> EntityDef

persistFieldDef :: EntityField Sentence typ -> FieldDef

toPersistFields :: Sentence -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Sentence

persistUniqueKeys :: Sentence -> [Unique Sentence]

persistUniqueToFieldNames :: Unique Sentence -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Sentence -> [PersistValue]

fieldLens :: EntityField Sentence field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Sentence -> f (Entity Sentence)

PersistField Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Sentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text Sentence

(TypeError (MultipleUniqueKeysError Sentence) :: Constraint) => AtLeastOneUniqueKey Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Sentence -> NonEmpty (Unique Sentence)

(TypeError (NoUniqueKeysError Sentence) :: Constraint) => OnlyOneUniqueKey Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Sentence -> Unique Sentence

PersistFieldSql Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Sentence -> SqlType

(PersistQuery backend, PersistEntityBackend Sentence ~ BaseBackend backend) => DeleteCascade Sentence backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Sentence -> ReaderT backend m ()

ToBackendKey SqlBackend Sentence Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Sentence -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Sentence

Eq (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Sentence -> Key Sentence -> Bool

(/=) :: Key Sentence -> Key Sentence -> Bool

Ord (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Sentence -> Key Sentence -> Ordering

(<) :: Key Sentence -> Key Sentence -> Bool

(<=) :: Key Sentence -> Key Sentence -> Bool

(>) :: Key Sentence -> Key Sentence -> Bool

(>=) :: Key Sentence -> Key Sentence -> Bool

max :: Key Sentence -> Key Sentence -> Key Sentence

min :: Key Sentence -> Key Sentence -> Key Sentence

Read (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Sentence)

readList :: ReadS [Key Sentence]

readPrec :: ReadPrec (Key Sentence)

readListPrec :: ReadPrec [Key Sentence]

Show (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Sentence -> ShowS

show :: Key Sentence -> String

showList :: [Key Sentence] -> ShowS

FromJSON (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Sentence)

parseJSONList :: Value -> Parser [Key Sentence]

ToJSON (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Sentence -> Value

toEncoding :: Key Sentence -> Encoding

toJSONList :: [Key Sentence] -> Value

toEncodingList :: [Key Sentence] -> Encoding

PersistField (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Sentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Sentence)

PersistFieldSql (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Sentence) -> SqlType

FromHttpApiData (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Sentence)

parseHeader :: ByteString -> Either Text (Key Sentence)

parseQueryParam :: Text -> Either Text (Key Sentence)

PathPiece (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Sentence)

toPathPiece :: Key Sentence -> Text

ToHttpApiData (Key Sentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Sentence -> Text

toEncodedUrlPiece :: Key Sentence -> Builder

toHeader :: Key Sentence -> ByteString

toQueryParam :: Key Sentence -> Text

data EntityField Sentence typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Sentence typ
newtype Key Sentence Source # 
Instance details

Defined in Persistence.Schema

newtype Key Sentence = SentenceKey {}
type PersistEntityBackend Sentence Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Sentence = SqlBackend
data Unique Sentence Source # 
Instance details

Defined in Persistence.Schema

data Unique Sentence

data Axiom Source #

Constructors

Axiom 

Instances

Instances details
Show Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Axiom -> ShowS

show :: Axiom -> String

showList :: [Axiom] -> ShowS

PersistEntity Axiom Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Axiom

data Key Axiom

data EntityField Axiom :: Type -> Type

data Unique Axiom

Methods

keyToValues :: Key Axiom -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Axiom)

persistIdField :: EntityField Axiom (Key Axiom)

entityDef :: Monad m => m Axiom -> EntityDef

persistFieldDef :: EntityField Axiom typ -> FieldDef

toPersistFields :: Axiom -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Axiom

persistUniqueKeys :: Axiom -> [Unique Axiom]

persistUniqueToFieldNames :: Unique Axiom -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Axiom -> [PersistValue]

fieldLens :: EntityField Axiom field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Axiom -> f (Entity Axiom)

PersistField Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Axiom -> PersistValue

fromPersistValue :: PersistValue -> Either Text Axiom

(TypeError (MultipleUniqueKeysError Axiom) :: Constraint) => AtLeastOneUniqueKey Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Axiom -> NonEmpty (Unique Axiom)

(TypeError (NoUniqueKeysError Axiom) :: Constraint) => OnlyOneUniqueKey Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Axiom -> Unique Axiom

PersistFieldSql Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Axiom -> SqlType

(PersistQuery backend, PersistEntityBackend Axiom ~ BaseBackend backend) => DeleteCascade Axiom backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Axiom -> ReaderT backend m ()

ToBackendKey SqlBackend Axiom Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Axiom -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Axiom

Eq (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Axiom -> Key Axiom -> Bool

(/=) :: Key Axiom -> Key Axiom -> Bool

Ord (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Axiom -> Key Axiom -> Ordering

(<) :: Key Axiom -> Key Axiom -> Bool

(<=) :: Key Axiom -> Key Axiom -> Bool

(>) :: Key Axiom -> Key Axiom -> Bool

(>=) :: Key Axiom -> Key Axiom -> Bool

max :: Key Axiom -> Key Axiom -> Key Axiom

min :: Key Axiom -> Key Axiom -> Key Axiom

Read (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Axiom)

readList :: ReadS [Key Axiom]

readPrec :: ReadPrec (Key Axiom)

readListPrec :: ReadPrec [Key Axiom]

Show (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Axiom -> ShowS

show :: Key Axiom -> String

showList :: [Key Axiom] -> ShowS

FromJSON (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Axiom)

parseJSONList :: Value -> Parser [Key Axiom]

ToJSON (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Axiom -> Value

toEncoding :: Key Axiom -> Encoding

toJSONList :: [Key Axiom] -> Value

toEncodingList :: [Key Axiom] -> Encoding

PersistField (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Axiom -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Axiom)

PersistFieldSql (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Axiom) -> SqlType

FromHttpApiData (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Axiom)

parseHeader :: ByteString -> Either Text (Key Axiom)

parseQueryParam :: Text -> Either Text (Key Axiom)

PathPiece (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Axiom)

toPathPiece :: Key Axiom -> Text

ToHttpApiData (Key Axiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Axiom -> Text

toEncodedUrlPiece :: Key Axiom -> Builder

toHeader :: Key Axiom -> ByteString

toQueryParam :: Key Axiom -> Text

data EntityField Axiom typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Axiom typ = typ ~ Key Axiom => AxiomId
newtype Key Axiom Source # 
Instance details

Defined in Persistence.Schema

newtype Key Axiom = AxiomKey {}
type PersistEntityBackend Axiom Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Axiom = SqlBackend
data Unique Axiom Source # 
Instance details

Defined in Persistence.Schema

data Unique Axiom

type AxiomId = Key Axiom Source #

data Conjecture Source #

Instances

Instances details
Show Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Conjecture -> ShowS

show :: Conjecture -> String

showList :: [Conjecture] -> ShowS

PersistEntity Conjecture Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Conjecture

data Key Conjecture

data EntityField Conjecture :: Type -> Type

data Unique Conjecture

Methods

keyToValues :: Key Conjecture -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Conjecture)

persistIdField :: EntityField Conjecture (Key Conjecture)

entityDef :: Monad m => m Conjecture -> EntityDef

persistFieldDef :: EntityField Conjecture typ -> FieldDef

toPersistFields :: Conjecture -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Conjecture

persistUniqueKeys :: Conjecture -> [Unique Conjecture]

persistUniqueToFieldNames :: Unique Conjecture -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Conjecture -> [PersistValue]

fieldLens :: EntityField Conjecture field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Conjecture -> f (Entity Conjecture)

PersistField Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Conjecture -> PersistValue

fromPersistValue :: PersistValue -> Either Text Conjecture

(TypeError (MultipleUniqueKeysError Conjecture) :: Constraint) => AtLeastOneUniqueKey Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Conjecture -> NonEmpty (Unique Conjecture)

(TypeError (NoUniqueKeysError Conjecture) :: Constraint) => OnlyOneUniqueKey Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Conjecture -> Unique Conjecture

PersistFieldSql Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Conjecture -> SqlType

(PersistQuery backend, PersistEntityBackend Conjecture ~ BaseBackend backend) => DeleteCascade Conjecture backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Conjecture -> ReaderT backend m ()

ToBackendKey SqlBackend Conjecture Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Conjecture -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Conjecture

Eq (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Conjecture -> Key Conjecture -> Bool

(/=) :: Key Conjecture -> Key Conjecture -> Bool

Ord (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Conjecture -> Key Conjecture -> Ordering

(<) :: Key Conjecture -> Key Conjecture -> Bool

(<=) :: Key Conjecture -> Key Conjecture -> Bool

(>) :: Key Conjecture -> Key Conjecture -> Bool

(>=) :: Key Conjecture -> Key Conjecture -> Bool

max :: Key Conjecture -> Key Conjecture -> Key Conjecture

min :: Key Conjecture -> Key Conjecture -> Key Conjecture

Read (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Conjecture)

readList :: ReadS [Key Conjecture]

readPrec :: ReadPrec (Key Conjecture)

readListPrec :: ReadPrec [Key Conjecture]

Show (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Conjecture -> ShowS

show :: Key Conjecture -> String

showList :: [Key Conjecture] -> ShowS

FromJSON (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Conjecture)

parseJSONList :: Value -> Parser [Key Conjecture]

ToJSON (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Conjecture -> Value

toEncoding :: Key Conjecture -> Encoding

toJSONList :: [Key Conjecture] -> Value

toEncodingList :: [Key Conjecture] -> Encoding

PersistField (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Conjecture -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Conjecture)

PersistFieldSql (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Conjecture) -> SqlType

FromHttpApiData (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Conjecture)

parseHeader :: ByteString -> Either Text (Key Conjecture)

parseQueryParam :: Text -> Either Text (Key Conjecture)

PathPiece (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Conjecture)

toPathPiece :: Key Conjecture -> Text

ToHttpApiData (Key Conjecture) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Conjecture -> Text

toEncodedUrlPiece :: Key Conjecture -> Builder

toHeader :: Key Conjecture -> ByteString

toQueryParam :: Key Conjecture -> Text

data EntityField Conjecture typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Conjecture typ
newtype Key Conjecture Source # 
Instance details

Defined in Persistence.Schema

newtype Key Conjecture = ConjectureKey {}
type PersistEntityBackend Conjecture Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Conjecture = SqlBackend
data Unique Conjecture Source # 
Instance details

Defined in Persistence.Schema

data Unique Conjecture

data Symbol Source #

Constructors

Symbol 

Fields

Instances

Instances details
Show Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Symbol -> ShowS

show :: Symbol -> String

showList :: [Symbol] -> ShowS

PersistEntity Symbol Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Symbol

data Key Symbol

data EntityField Symbol :: Type -> Type

data Unique Symbol

Methods

keyToValues :: Key Symbol -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Symbol)

persistIdField :: EntityField Symbol (Key Symbol)

entityDef :: Monad m => m Symbol -> EntityDef

persistFieldDef :: EntityField Symbol typ -> FieldDef

toPersistFields :: Symbol -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Symbol

persistUniqueKeys :: Symbol -> [Unique Symbol]

persistUniqueToFieldNames :: Unique Symbol -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Symbol -> [PersistValue]

fieldLens :: EntityField Symbol field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Symbol -> f (Entity Symbol)

PersistField Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Symbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text Symbol

(TypeError (MultipleUniqueKeysError Symbol) :: Constraint) => AtLeastOneUniqueKey Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Symbol -> NonEmpty (Unique Symbol)

(TypeError (NoUniqueKeysError Symbol) :: Constraint) => OnlyOneUniqueKey Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Symbol -> Unique Symbol

PersistFieldSql Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Symbol -> SqlType

(PersistQuery backend, PersistEntityBackend Symbol ~ BaseBackend backend) => DeleteCascade Symbol backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Symbol -> ReaderT backend m ()

ToBackendKey SqlBackend Symbol Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Symbol -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Symbol

Eq (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Symbol -> Key Symbol -> Bool

(/=) :: Key Symbol -> Key Symbol -> Bool

Ord (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Symbol -> Key Symbol -> Ordering

(<) :: Key Symbol -> Key Symbol -> Bool

(<=) :: Key Symbol -> Key Symbol -> Bool

(>) :: Key Symbol -> Key Symbol -> Bool

(>=) :: Key Symbol -> Key Symbol -> Bool

max :: Key Symbol -> Key Symbol -> Key Symbol

min :: Key Symbol -> Key Symbol -> Key Symbol

Read (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Symbol)

readList :: ReadS [Key Symbol]

readPrec :: ReadPrec (Key Symbol)

readListPrec :: ReadPrec [Key Symbol]

Show (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Symbol -> ShowS

show :: Key Symbol -> String

showList :: [Key Symbol] -> ShowS

FromJSON (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Symbol)

parseJSONList :: Value -> Parser [Key Symbol]

ToJSON (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Symbol -> Value

toEncoding :: Key Symbol -> Encoding

toJSONList :: [Key Symbol] -> Value

toEncodingList :: [Key Symbol] -> Encoding

PersistField (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Symbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Symbol)

PersistFieldSql (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Symbol) -> SqlType

FromHttpApiData (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Symbol)

parseHeader :: ByteString -> Either Text (Key Symbol)

parseQueryParam :: Text -> Either Text (Key Symbol)

PathPiece (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Symbol)

toPathPiece :: Key Symbol -> Text

ToHttpApiData (Key Symbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Symbol -> Text

toEncodedUrlPiece :: Key Symbol -> Builder

toHeader :: Key Symbol -> ByteString

toQueryParam :: Key Symbol -> Text

data EntityField Symbol typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Symbol typ
newtype Key Symbol Source # 
Instance details

Defined in Persistence.Schema

newtype Key Symbol = SymbolKey {}
type PersistEntityBackend Symbol Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Symbol = SqlBackend
data Unique Symbol Source # 
Instance details

Defined in Persistence.Schema

data Unique Symbol

type SymbolId = Key Symbol Source #

data SymbolMapping Source #

Instances

Instances details
Show SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SymbolMapping -> ShowS

show :: SymbolMapping -> String

showList :: [SymbolMapping] -> ShowS

PersistEntity SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SymbolMapping

data Key SymbolMapping

data EntityField SymbolMapping :: Type -> Type

data Unique SymbolMapping

Methods

keyToValues :: Key SymbolMapping -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SymbolMapping)

persistIdField :: EntityField SymbolMapping (Key SymbolMapping)

entityDef :: Monad m => m SymbolMapping -> EntityDef

persistFieldDef :: EntityField SymbolMapping typ -> FieldDef

toPersistFields :: SymbolMapping -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SymbolMapping

persistUniqueKeys :: SymbolMapping -> [Unique SymbolMapping]

persistUniqueToFieldNames :: Unique SymbolMapping -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SymbolMapping -> [PersistValue]

fieldLens :: EntityField SymbolMapping field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SymbolMapping -> f (Entity SymbolMapping)

PersistField SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SymbolMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text SymbolMapping

(TypeError (MultipleUniqueKeysError SymbolMapping) :: Constraint) => AtLeastOneUniqueKey SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: SymbolMapping -> NonEmpty (Unique SymbolMapping)

(TypeError (NoUniqueKeysError SymbolMapping) :: Constraint) => OnlyOneUniqueKey SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SymbolMapping -> SqlType

(PersistQuery backend, PersistEntityBackend SymbolMapping ~ BaseBackend backend) => DeleteCascade SymbolMapping backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SymbolMapping -> ReaderT backend m ()

ToBackendKey SqlBackend SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key SymbolMapping -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key SymbolMapping

Eq (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key SymbolMapping -> Key SymbolMapping -> Bool

(/=) :: Key SymbolMapping -> Key SymbolMapping -> Bool

Ord (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key SymbolMapping -> Key SymbolMapping -> Ordering

(<) :: Key SymbolMapping -> Key SymbolMapping -> Bool

(<=) :: Key SymbolMapping -> Key SymbolMapping -> Bool

(>) :: Key SymbolMapping -> Key SymbolMapping -> Bool

(>=) :: Key SymbolMapping -> Key SymbolMapping -> Bool

max :: Key SymbolMapping -> Key SymbolMapping -> Key SymbolMapping

min :: Key SymbolMapping -> Key SymbolMapping -> Key SymbolMapping

Read (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SymbolMapping)

readList :: ReadS [Key SymbolMapping]

readPrec :: ReadPrec (Key SymbolMapping)

readListPrec :: ReadPrec [Key SymbolMapping]

Show (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SymbolMapping -> ShowS

show :: Key SymbolMapping -> String

showList :: [Key SymbolMapping] -> ShowS

FromJSON (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SymbolMapping)

parseJSONList :: Value -> Parser [Key SymbolMapping]

ToJSON (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SymbolMapping -> Value

toEncoding :: Key SymbolMapping -> Encoding

toJSONList :: [Key SymbolMapping] -> Value

toEncodingList :: [Key SymbolMapping] -> Encoding

PersistField (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SymbolMapping -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SymbolMapping)

PersistFieldSql (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SymbolMapping) -> SqlType

FromHttpApiData (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key SymbolMapping)

parseHeader :: ByteString -> Either Text (Key SymbolMapping)

parseQueryParam :: Text -> Either Text (Key SymbolMapping)

PathPiece (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key SymbolMapping)

toPathPiece :: Key SymbolMapping -> Text

ToHttpApiData (Key SymbolMapping) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key SymbolMapping -> Text

toEncodedUrlPiece :: Key SymbolMapping -> Builder

toHeader :: Key SymbolMapping -> ByteString

toQueryParam :: Key SymbolMapping -> Text

data EntityField SymbolMapping typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

newtype Key SymbolMapping = SymbolMappingKey {}
type PersistEntityBackend SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SymbolMapping = SqlBackend
data Unique SymbolMapping Source # 
Instance details

Defined in Persistence.Schema

data Unique SymbolMapping

data SentenceSymbol Source #

Instances

Instances details
Show SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SentenceSymbol -> ShowS

show :: SentenceSymbol -> String

showList :: [SentenceSymbol] -> ShowS

PersistEntity SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SentenceSymbol

data Key SentenceSymbol

data EntityField SentenceSymbol :: Type -> Type

data Unique SentenceSymbol

Methods

keyToValues :: Key SentenceSymbol -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SentenceSymbol)

persistIdField :: EntityField SentenceSymbol (Key SentenceSymbol)

entityDef :: Monad m => m SentenceSymbol -> EntityDef

persistFieldDef :: EntityField SentenceSymbol typ -> FieldDef

toPersistFields :: SentenceSymbol -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SentenceSymbol

persistUniqueKeys :: SentenceSymbol -> [Unique SentenceSymbol]

persistUniqueToFieldNames :: Unique SentenceSymbol -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SentenceSymbol -> [PersistValue]

fieldLens :: EntityField SentenceSymbol field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SentenceSymbol -> f (Entity SentenceSymbol)

PersistField SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SentenceSymbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text SentenceSymbol

(TypeError (MultipleUniqueKeysError SentenceSymbol) :: Constraint) => AtLeastOneUniqueKey SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: SentenceSymbol -> NonEmpty (Unique SentenceSymbol)

(TypeError (NoUniqueKeysError SentenceSymbol) :: Constraint) => OnlyOneUniqueKey SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SentenceSymbol -> SqlType

(PersistQuery backend, PersistEntityBackend SentenceSymbol ~ BaseBackend backend) => DeleteCascade SentenceSymbol backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SentenceSymbol -> ReaderT backend m ()

Eq (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

(/=) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

Ord (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key SentenceSymbol -> Key SentenceSymbol -> Ordering

(<) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

(<=) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

(>) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

(>=) :: Key SentenceSymbol -> Key SentenceSymbol -> Bool

max :: Key SentenceSymbol -> Key SentenceSymbol -> Key SentenceSymbol

min :: Key SentenceSymbol -> Key SentenceSymbol -> Key SentenceSymbol

Read (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SentenceSymbol)

readList :: ReadS [Key SentenceSymbol]

readPrec :: ReadPrec (Key SentenceSymbol)

readListPrec :: ReadPrec [Key SentenceSymbol]

Show (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SentenceSymbol -> ShowS

show :: Key SentenceSymbol -> String

showList :: [Key SentenceSymbol] -> ShowS

Generic (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type Rep (Key SentenceSymbol) :: Type -> Type

Methods

from :: Key SentenceSymbol -> Rep (Key SentenceSymbol) x

to :: Rep (Key SentenceSymbol) x -> Key SentenceSymbol

FromJSON (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SentenceSymbol)

parseJSONList :: Value -> Parser [Key SentenceSymbol]

ToJSON (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SentenceSymbol -> Value

toEncoding :: Key SentenceSymbol -> Encoding

toJSONList :: [Key SentenceSymbol] -> Value

toEncodingList :: [Key SentenceSymbol] -> Encoding

PersistField (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SentenceSymbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SentenceSymbol)

PersistFieldSql (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SentenceSymbol) -> SqlType

data EntityField SentenceSymbol typ Source # 
Instance details

Defined in Persistence.Schema

data Key SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SentenceSymbol = SqlBackend
data Unique SentenceSymbol Source # 
Instance details

Defined in Persistence.Schema

data Unique SentenceSymbol
type Rep (Key SentenceSymbol) Source # 
Instance details

Defined in Persistence.Schema

type Rep (Key SentenceSymbol) = D1 ('MetaData "Key" "Persistence.Schema" "main" 'False) (C1 ('MetaCons "SentenceSymbolKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "sentenceSymbolKeysentenceId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocIdBaseId) :*: S1 ('MetaSel ('Just "sentenceSymbolKeysymbolId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocIdBaseId)))

data SignatureSymbol Source #

Instances

Instances details
Show SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SignatureSymbol -> ShowS

show :: SignatureSymbol -> String

showList :: [SignatureSymbol] -> ShowS

PersistEntity SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SignatureSymbol

data Key SignatureSymbol

data EntityField SignatureSymbol :: Type -> Type

data Unique SignatureSymbol

Methods

keyToValues :: Key SignatureSymbol -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SignatureSymbol)

persistIdField :: EntityField SignatureSymbol (Key SignatureSymbol)

entityDef :: Monad m => m SignatureSymbol -> EntityDef

persistFieldDef :: EntityField SignatureSymbol typ -> FieldDef

toPersistFields :: SignatureSymbol -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SignatureSymbol

persistUniqueKeys :: SignatureSymbol -> [Unique SignatureSymbol]

persistUniqueToFieldNames :: Unique SignatureSymbol -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SignatureSymbol -> [PersistValue]

fieldLens :: EntityField SignatureSymbol field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SignatureSymbol -> f (Entity SignatureSymbol)

PersistField SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SignatureSymbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text SignatureSymbol

(TypeError (MultipleUniqueKeysError SignatureSymbol) :: Constraint) => AtLeastOneUniqueKey SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: SignatureSymbol -> NonEmpty (Unique SignatureSymbol)

(TypeError (NoUniqueKeysError SignatureSymbol) :: Constraint) => OnlyOneUniqueKey SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SignatureSymbol -> SqlType

(PersistQuery backend, PersistEntityBackend SignatureSymbol ~ BaseBackend backend) => DeleteCascade SignatureSymbol backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SignatureSymbol -> ReaderT backend m ()

Eq (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

(/=) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

Ord (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key SignatureSymbol -> Key SignatureSymbol -> Ordering

(<) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

(<=) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

(>) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

(>=) :: Key SignatureSymbol -> Key SignatureSymbol -> Bool

max :: Key SignatureSymbol -> Key SignatureSymbol -> Key SignatureSymbol

min :: Key SignatureSymbol -> Key SignatureSymbol -> Key SignatureSymbol

Read (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SignatureSymbol)

readList :: ReadS [Key SignatureSymbol]

readPrec :: ReadPrec (Key SignatureSymbol)

readListPrec :: ReadPrec [Key SignatureSymbol]

Show (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SignatureSymbol -> ShowS

show :: Key SignatureSymbol -> String

showList :: [Key SignatureSymbol] -> ShowS

Generic (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type Rep (Key SignatureSymbol) :: Type -> Type

Methods

from :: Key SignatureSymbol -> Rep (Key SignatureSymbol) x

to :: Rep (Key SignatureSymbol) x -> Key SignatureSymbol

FromJSON (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SignatureSymbol)

parseJSONList :: Value -> Parser [Key SignatureSymbol]

ToJSON (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SignatureSymbol -> Value

toEncoding :: Key SignatureSymbol -> Encoding

toJSONList :: [Key SignatureSymbol] -> Value

toEncodingList :: [Key SignatureSymbol] -> Encoding

PersistField (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SignatureSymbol -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SignatureSymbol)

PersistFieldSql (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SignatureSymbol) -> SqlType

data EntityField SignatureSymbol typ Source # 
Instance details

Defined in Persistence.Schema

data Key SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SignatureSymbol = SqlBackend
data Unique SignatureSymbol Source # 
Instance details

Defined in Persistence.Schema

data Unique SignatureSymbol
type Rep (Key SignatureSymbol) Source # 
Instance details

Defined in Persistence.Schema

type Rep (Key SignatureSymbol) = D1 ('MetaData "Key" "Persistence.Schema" "main" 'False) (C1 ('MetaCons "SignatureSymbolKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "signatureSymbolKeysignatureId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SignatureId) :*: S1 ('MetaSel ('Just "signatureSymbolKeysymbolId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocIdBaseId)))

data Reasoner Source #

Constructors

Reasoner 

Instances

Instances details
Show Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Reasoner -> ShowS

show :: Reasoner -> String

showList :: [Reasoner] -> ShowS

PersistEntity Reasoner Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend Reasoner

data Key Reasoner

data EntityField Reasoner :: Type -> Type

data Unique Reasoner

Methods

keyToValues :: Key Reasoner -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Reasoner)

persistIdField :: EntityField Reasoner (Key Reasoner)

entityDef :: Monad m => m Reasoner -> EntityDef

persistFieldDef :: EntityField Reasoner typ -> FieldDef

toPersistFields :: Reasoner -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Reasoner

persistUniqueKeys :: Reasoner -> [Unique Reasoner]

persistUniqueToFieldNames :: Unique Reasoner -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique Reasoner -> [PersistValue]

fieldLens :: EntityField Reasoner field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Reasoner -> f (Entity Reasoner)

PersistField Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Reasoner -> PersistValue

fromPersistValue :: PersistValue -> Either Text Reasoner

AtLeastOneUniqueKey Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: Reasoner -> NonEmpty (Unique Reasoner)

OnlyOneUniqueKey Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

onlyUniqueP :: Reasoner -> Unique Reasoner

PersistFieldSql Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy Reasoner -> SqlType

(PersistQuery backend, PersistEntityBackend Reasoner ~ BaseBackend backend) => DeleteCascade Reasoner backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key Reasoner -> ReaderT backend m ()

ToBackendKey SqlBackend Reasoner Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key Reasoner -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Reasoner

Eq (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key Reasoner -> Key Reasoner -> Bool

(/=) :: Key Reasoner -> Key Reasoner -> Bool

Ord (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key Reasoner -> Key Reasoner -> Ordering

(<) :: Key Reasoner -> Key Reasoner -> Bool

(<=) :: Key Reasoner -> Key Reasoner -> Bool

(>) :: Key Reasoner -> Key Reasoner -> Bool

(>=) :: Key Reasoner -> Key Reasoner -> Bool

max :: Key Reasoner -> Key Reasoner -> Key Reasoner

min :: Key Reasoner -> Key Reasoner -> Key Reasoner

Read (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key Reasoner)

readList :: ReadS [Key Reasoner]

readPrec :: ReadPrec (Key Reasoner)

readListPrec :: ReadPrec [Key Reasoner]

Show (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key Reasoner -> ShowS

show :: Key Reasoner -> String

showList :: [Key Reasoner] -> ShowS

Show (Unique Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Unique Reasoner -> ShowS

show :: Unique Reasoner -> String

showList :: [Unique Reasoner] -> ShowS

FromJSON (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key Reasoner)

parseJSONList :: Value -> Parser [Key Reasoner]

ToJSON (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key Reasoner -> Value

toEncoding :: Key Reasoner -> Encoding

toJSONList :: [Key Reasoner] -> Value

toEncodingList :: [Key Reasoner] -> Encoding

PersistField (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key Reasoner -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Reasoner)

PersistFieldSql (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key Reasoner) -> SqlType

FromHttpApiData (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key Reasoner)

parseHeader :: ByteString -> Either Text (Key Reasoner)

parseQueryParam :: Text -> Either Text (Key Reasoner)

PathPiece (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key Reasoner)

toPathPiece :: Key Reasoner -> Text

ToHttpApiData (Key Reasoner) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key Reasoner -> Text

toEncodedUrlPiece :: Key Reasoner -> Builder

toHeader :: Key Reasoner -> ByteString

toQueryParam :: Key Reasoner -> Text

data EntityField Reasoner typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField Reasoner typ
newtype Key Reasoner Source # 
Instance details

Defined in Persistence.Schema

newtype Key Reasoner = ReasonerKey {}
type PersistEntityBackend Reasoner Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend Reasoner = SqlBackend
data Unique Reasoner Source # 
Instance details

Defined in Persistence.Schema

data ReasonerConfiguration Source #

Instances

Instances details
Show ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> ReasonerConfiguration -> ShowS

show :: ReasonerConfiguration -> String

showList :: [ReasonerConfiguration] -> ShowS

PersistEntity ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ReasonerConfiguration

data Key ReasonerConfiguration

data EntityField ReasonerConfiguration :: Type -> Type

data Unique ReasonerConfiguration

Methods

keyToValues :: Key ReasonerConfiguration -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ReasonerConfiguration)

persistIdField :: EntityField ReasonerConfiguration (Key ReasonerConfiguration)

entityDef :: Monad m => m ReasonerConfiguration -> EntityDef

persistFieldDef :: EntityField ReasonerConfiguration typ -> FieldDef

toPersistFields :: ReasonerConfiguration -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ReasonerConfiguration

persistUniqueKeys :: ReasonerConfiguration -> [Unique ReasonerConfiguration]

persistUniqueToFieldNames :: Unique ReasonerConfiguration -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ReasonerConfiguration -> [PersistValue]

fieldLens :: EntityField ReasonerConfiguration field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ReasonerConfiguration -> f (Entity ReasonerConfiguration)

PersistField ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ReasonerConfiguration -> PersistValue

fromPersistValue :: PersistValue -> Either Text ReasonerConfiguration

(TypeError (MultipleUniqueKeysError ReasonerConfiguration) :: Constraint) => AtLeastOneUniqueKey ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError ReasonerConfiguration) :: Constraint) => OnlyOneUniqueKey ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ReasonerConfiguration -> SqlType

(PersistQuery backend, PersistEntityBackend ReasonerConfiguration ~ BaseBackend backend) => DeleteCascade ReasonerConfiguration backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ReasonerConfiguration -> ReaderT backend m ()

ToBackendKey SqlBackend ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ReasonerConfiguration -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ReasonerConfiguration

Eq (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ReasonerConfiguration)

readList :: ReadS [Key ReasonerConfiguration]

readPrec :: ReadPrec (Key ReasonerConfiguration)

readListPrec :: ReadPrec [Key ReasonerConfiguration]

Show (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ReasonerConfiguration -> ShowS

show :: Key ReasonerConfiguration -> String

showList :: [Key ReasonerConfiguration] -> ShowS

FromJSON (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ReasonerConfiguration)

parseJSONList :: Value -> Parser [Key ReasonerConfiguration]

ToJSON (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key ReasonerConfiguration -> Value

toEncoding :: Key ReasonerConfiguration -> Encoding

toJSONList :: [Key ReasonerConfiguration] -> Value

toEncodingList :: [Key ReasonerConfiguration] -> Encoding

PersistField (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ReasonerConfiguration -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ReasonerConfiguration)

PersistFieldSql (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ReasonerConfiguration) -> SqlType

FromHttpApiData (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ReasonerConfiguration)

parseHeader :: ByteString -> Either Text (Key ReasonerConfiguration)

parseQueryParam :: Text -> Either Text (Key ReasonerConfiguration)

PathPiece (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ReasonerConfiguration)

toPathPiece :: Key ReasonerConfiguration -> Text

ToHttpApiData (Key ReasonerConfiguration) Source # 
Instance details

Defined in Persistence.Schema

data EntityField ReasonerConfiguration typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ReasonerConfiguration = SqlBackend
data Unique ReasonerConfiguration Source # 
Instance details

Defined in Persistence.Schema

data ManualPremiseSelection Source #

Instances

Instances details
Show ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

PersistEntity ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ManualPremiseSelection

data Key ManualPremiseSelection

data EntityField ManualPremiseSelection :: Type -> Type

data Unique ManualPremiseSelection

Methods

keyToValues :: Key ManualPremiseSelection -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ManualPremiseSelection)

persistIdField :: EntityField ManualPremiseSelection (Key ManualPremiseSelection)

entityDef :: Monad m => m ManualPremiseSelection -> EntityDef

persistFieldDef :: EntityField ManualPremiseSelection typ -> FieldDef

toPersistFields :: ManualPremiseSelection -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ManualPremiseSelection

persistUniqueKeys :: ManualPremiseSelection -> [Unique ManualPremiseSelection]

persistUniqueToFieldNames :: Unique ManualPremiseSelection -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ManualPremiseSelection -> [PersistValue]

fieldLens :: EntityField ManualPremiseSelection field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ManualPremiseSelection -> f (Entity ManualPremiseSelection)

PersistField ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ManualPremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text ManualPremiseSelection

(TypeError (MultipleUniqueKeysError ManualPremiseSelection) :: Constraint) => AtLeastOneUniqueKey ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError ManualPremiseSelection) :: Constraint) => OnlyOneUniqueKey ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ManualPremiseSelection -> SqlType

(PersistQuery backend, PersistEntityBackend ManualPremiseSelection ~ BaseBackend backend) => DeleteCascade ManualPremiseSelection backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ManualPremiseSelection -> ReaderT backend m ()

ToBackendKey SqlBackend ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ManualPremiseSelection -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ManualPremiseSelection

Eq (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ManualPremiseSelection)

readList :: ReadS [Key ManualPremiseSelection]

readPrec :: ReadPrec (Key ManualPremiseSelection)

readListPrec :: ReadPrec [Key ManualPremiseSelection]

Show (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ManualPremiseSelection -> ShowS

show :: Key ManualPremiseSelection -> String

showList :: [Key ManualPremiseSelection] -> ShowS

FromJSON (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ManualPremiseSelection)

parseJSONList :: Value -> Parser [Key ManualPremiseSelection]

ToJSON (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

PersistField (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ManualPremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ManualPremiseSelection)

PersistFieldSql (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ManualPremiseSelection) -> SqlType

FromHttpApiData (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ManualPremiseSelection)

parseHeader :: ByteString -> Either Text (Key ManualPremiseSelection)

parseQueryParam :: Text -> Either Text (Key ManualPremiseSelection)

PathPiece (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ManualPremiseSelection)

toPathPiece :: Key ManualPremiseSelection -> Text

ToHttpApiData (Key ManualPremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

data EntityField ManualPremiseSelection typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ManualPremiseSelection = SqlBackend
data Unique ManualPremiseSelection Source # 
Instance details

Defined in Persistence.Schema

data SinePremiseSelection Source #

Constructors

SinePremiseSelection 

Instances

Instances details
Show SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SinePremiseSelection -> ShowS

show :: SinePremiseSelection -> String

showList :: [SinePremiseSelection] -> ShowS

PersistEntity SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SinePremiseSelection

data Key SinePremiseSelection

data EntityField SinePremiseSelection :: Type -> Type

data Unique SinePremiseSelection

Methods

keyToValues :: Key SinePremiseSelection -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SinePremiseSelection)

persistIdField :: EntityField SinePremiseSelection (Key SinePremiseSelection)

entityDef :: Monad m => m SinePremiseSelection -> EntityDef

persistFieldDef :: EntityField SinePremiseSelection typ -> FieldDef

toPersistFields :: SinePremiseSelection -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SinePremiseSelection

persistUniqueKeys :: SinePremiseSelection -> [Unique SinePremiseSelection]

persistUniqueToFieldNames :: Unique SinePremiseSelection -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SinePremiseSelection -> [PersistValue]

fieldLens :: EntityField SinePremiseSelection field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SinePremiseSelection -> f (Entity SinePremiseSelection)

PersistField SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SinePremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text SinePremiseSelection

(TypeError (MultipleUniqueKeysError SinePremiseSelection) :: Constraint) => AtLeastOneUniqueKey SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError SinePremiseSelection) :: Constraint) => OnlyOneUniqueKey SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SinePremiseSelection -> SqlType

(PersistQuery backend, PersistEntityBackend SinePremiseSelection ~ BaseBackend backend) => DeleteCascade SinePremiseSelection backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SinePremiseSelection -> ReaderT backend m ()

ToBackendKey SqlBackend SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key SinePremiseSelection -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key SinePremiseSelection

Eq (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Read (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SinePremiseSelection)

readList :: ReadS [Key SinePremiseSelection]

readPrec :: ReadPrec (Key SinePremiseSelection)

readListPrec :: ReadPrec [Key SinePremiseSelection]

Show (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SinePremiseSelection -> ShowS

show :: Key SinePremiseSelection -> String

showList :: [Key SinePremiseSelection] -> ShowS

FromJSON (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SinePremiseSelection)

parseJSONList :: Value -> Parser [Key SinePremiseSelection]

ToJSON (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SinePremiseSelection -> Value

toEncoding :: Key SinePremiseSelection -> Encoding

toJSONList :: [Key SinePremiseSelection] -> Value

toEncodingList :: [Key SinePremiseSelection] -> Encoding

PersistField (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SinePremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SinePremiseSelection)

PersistFieldSql (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SinePremiseSelection) -> SqlType

FromHttpApiData (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key SinePremiseSelection)

parseHeader :: ByteString -> Either Text (Key SinePremiseSelection)

parseQueryParam :: Text -> Either Text (Key SinePremiseSelection)

PathPiece (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key SinePremiseSelection)

toPathPiece :: Key SinePremiseSelection -> Text

ToHttpApiData (Key SinePremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

data EntityField SinePremiseSelection typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SinePremiseSelection = SqlBackend
data Unique SinePremiseSelection Source # 
Instance details

Defined in Persistence.Schema

data SineSymbolPremiseTrigger Source #

Instances

Instances details
Show SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

PersistEntity SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SineSymbolPremiseTrigger

data Key SineSymbolPremiseTrigger

data EntityField SineSymbolPremiseTrigger :: Type -> Type

data Unique SineSymbolPremiseTrigger

Methods

keyToValues :: Key SineSymbolPremiseTrigger -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SineSymbolPremiseTrigger)

persistIdField :: EntityField SineSymbolPremiseTrigger (Key SineSymbolPremiseTrigger)

entityDef :: Monad m => m SineSymbolPremiseTrigger -> EntityDef

persistFieldDef :: EntityField SineSymbolPremiseTrigger typ -> FieldDef

toPersistFields :: SineSymbolPremiseTrigger -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SineSymbolPremiseTrigger

persistUniqueKeys :: SineSymbolPremiseTrigger -> [Unique SineSymbolPremiseTrigger]

persistUniqueToFieldNames :: Unique SineSymbolPremiseTrigger -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SineSymbolPremiseTrigger -> [PersistValue]

fieldLens :: EntityField SineSymbolPremiseTrigger field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SineSymbolPremiseTrigger -> f (Entity SineSymbolPremiseTrigger)

PersistField SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SineSymbolPremiseTrigger -> PersistValue

fromPersistValue :: PersistValue -> Either Text SineSymbolPremiseTrigger

(TypeError (MultipleUniqueKeysError SineSymbolPremiseTrigger) :: Constraint) => AtLeastOneUniqueKey SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError SineSymbolPremiseTrigger) :: Constraint) => OnlyOneUniqueKey SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SineSymbolPremiseTrigger -> SqlType

(PersistQuery backend, PersistEntityBackend SineSymbolPremiseTrigger ~ BaseBackend backend) => DeleteCascade SineSymbolPremiseTrigger backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SineSymbolPremiseTrigger -> ReaderT backend m ()

ToBackendKey SqlBackend SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key SineSymbolPremiseTrigger -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key SineSymbolPremiseTrigger

Eq (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Read (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Show (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SineSymbolPremiseTrigger -> ShowS

show :: Key SineSymbolPremiseTrigger -> String

showList :: [Key SineSymbolPremiseTrigger] -> ShowS

FromJSON (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SineSymbolPremiseTrigger)

parseJSONList :: Value -> Parser [Key SineSymbolPremiseTrigger]

ToJSON (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

PersistField (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SineSymbolPremiseTrigger -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SineSymbolPremiseTrigger)

PersistFieldSql (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SineSymbolPremiseTrigger) -> SqlType

FromHttpApiData (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key SineSymbolPremiseTrigger)

parseHeader :: ByteString -> Either Text (Key SineSymbolPremiseTrigger)

parseQueryParam :: Text -> Either Text (Key SineSymbolPremiseTrigger)

PathPiece (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

ToHttpApiData (Key SineSymbolPremiseTrigger) Source # 
Instance details

Defined in Persistence.Schema

data EntityField SineSymbolPremiseTrigger typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SineSymbolPremiseTrigger = SqlBackend
data Unique SineSymbolPremiseTrigger Source # 
Instance details

Defined in Persistence.Schema

data SineSymbolCommonness Source #

Instances

Instances details
Show SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> SineSymbolCommonness -> ShowS

show :: SineSymbolCommonness -> String

showList :: [SineSymbolCommonness] -> ShowS

PersistEntity SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend SineSymbolCommonness

data Key SineSymbolCommonness

data EntityField SineSymbolCommonness :: Type -> Type

data Unique SineSymbolCommonness

Methods

keyToValues :: Key SineSymbolCommonness -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key SineSymbolCommonness)

persistIdField :: EntityField SineSymbolCommonness (Key SineSymbolCommonness)

entityDef :: Monad m => m SineSymbolCommonness -> EntityDef

persistFieldDef :: EntityField SineSymbolCommonness typ -> FieldDef

toPersistFields :: SineSymbolCommonness -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text SineSymbolCommonness

persistUniqueKeys :: SineSymbolCommonness -> [Unique SineSymbolCommonness]

persistUniqueToFieldNames :: Unique SineSymbolCommonness -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique SineSymbolCommonness -> [PersistValue]

fieldLens :: EntityField SineSymbolCommonness field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity SineSymbolCommonness -> f (Entity SineSymbolCommonness)

PersistField SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: SineSymbolCommonness -> PersistValue

fromPersistValue :: PersistValue -> Either Text SineSymbolCommonness

(TypeError (MultipleUniqueKeysError SineSymbolCommonness) :: Constraint) => AtLeastOneUniqueKey SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError SineSymbolCommonness) :: Constraint) => OnlyOneUniqueKey SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy SineSymbolCommonness -> SqlType

(PersistQuery backend, PersistEntityBackend SineSymbolCommonness ~ BaseBackend backend) => DeleteCascade SineSymbolCommonness backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key SineSymbolCommonness -> ReaderT backend m ()

ToBackendKey SqlBackend SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key SineSymbolCommonness -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key SineSymbolCommonness

Eq (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Read (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key SineSymbolCommonness)

readList :: ReadS [Key SineSymbolCommonness]

readPrec :: ReadPrec (Key SineSymbolCommonness)

readListPrec :: ReadPrec [Key SineSymbolCommonness]

Show (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key SineSymbolCommonness -> ShowS

show :: Key SineSymbolCommonness -> String

showList :: [Key SineSymbolCommonness] -> ShowS

FromJSON (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key SineSymbolCommonness)

parseJSONList :: Value -> Parser [Key SineSymbolCommonness]

ToJSON (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key SineSymbolCommonness -> Value

toEncoding :: Key SineSymbolCommonness -> Encoding

toJSONList :: [Key SineSymbolCommonness] -> Value

toEncodingList :: [Key SineSymbolCommonness] -> Encoding

PersistField (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key SineSymbolCommonness -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key SineSymbolCommonness)

PersistFieldSql (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key SineSymbolCommonness) -> SqlType

FromHttpApiData (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key SineSymbolCommonness)

parseHeader :: ByteString -> Either Text (Key SineSymbolCommonness)

parseQueryParam :: Text -> Either Text (Key SineSymbolCommonness)

PathPiece (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key SineSymbolCommonness)

toPathPiece :: Key SineSymbolCommonness -> Text

ToHttpApiData (Key SineSymbolCommonness) Source # 
Instance details

Defined in Persistence.Schema

data EntityField SineSymbolCommonness typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend SineSymbolCommonness = SqlBackend
data Unique SineSymbolCommonness Source # 
Instance details

Defined in Persistence.Schema

data ReasoningAttempt Source #

Instances

Instances details
Show ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> ReasoningAttempt -> ShowS

show :: ReasoningAttempt -> String

showList :: [ReasoningAttempt] -> ShowS

PersistEntity ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ReasoningAttempt

data Key ReasoningAttempt

data EntityField ReasoningAttempt :: Type -> Type

data Unique ReasoningAttempt

Methods

keyToValues :: Key ReasoningAttempt -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ReasoningAttempt)

persistIdField :: EntityField ReasoningAttempt (Key ReasoningAttempt)

entityDef :: Monad m => m ReasoningAttempt -> EntityDef

persistFieldDef :: EntityField ReasoningAttempt typ -> FieldDef

toPersistFields :: ReasoningAttempt -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ReasoningAttempt

persistUniqueKeys :: ReasoningAttempt -> [Unique ReasoningAttempt]

persistUniqueToFieldNames :: Unique ReasoningAttempt -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ReasoningAttempt -> [PersistValue]

fieldLens :: EntityField ReasoningAttempt field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ReasoningAttempt -> f (Entity ReasoningAttempt)

PersistField ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ReasoningAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text ReasoningAttempt

(TypeError (MultipleUniqueKeysError ReasoningAttempt) :: Constraint) => AtLeastOneUniqueKey ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: ReasoningAttempt -> NonEmpty (Unique ReasoningAttempt)

(TypeError (NoUniqueKeysError ReasoningAttempt) :: Constraint) => OnlyOneUniqueKey ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ReasoningAttempt -> SqlType

(PersistQuery backend, PersistEntityBackend ReasoningAttempt ~ BaseBackend backend) => DeleteCascade ReasoningAttempt backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ReasoningAttempt -> ReaderT backend m ()

ToBackendKey SqlBackend ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ReasoningAttempt -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ReasoningAttempt

Eq (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key ReasoningAttempt -> Key ReasoningAttempt -> Bool

(/=) :: Key ReasoningAttempt -> Key ReasoningAttempt -> Bool

Ord (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ReasoningAttempt)

readList :: ReadS [Key ReasoningAttempt]

readPrec :: ReadPrec (Key ReasoningAttempt)

readListPrec :: ReadPrec [Key ReasoningAttempt]

Show (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ReasoningAttempt -> ShowS

show :: Key ReasoningAttempt -> String

showList :: [Key ReasoningAttempt] -> ShowS

FromJSON (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ReasoningAttempt)

parseJSONList :: Value -> Parser [Key ReasoningAttempt]

ToJSON (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key ReasoningAttempt -> Value

toEncoding :: Key ReasoningAttempt -> Encoding

toJSONList :: [Key ReasoningAttempt] -> Value

toEncodingList :: [Key ReasoningAttempt] -> Encoding

PersistField (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ReasoningAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ReasoningAttempt)

PersistFieldSql (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ReasoningAttempt) -> SqlType

FromHttpApiData (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ReasoningAttempt)

parseHeader :: ByteString -> Either Text (Key ReasoningAttempt)

parseQueryParam :: Text -> Either Text (Key ReasoningAttempt)

PathPiece (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ReasoningAttempt)

toPathPiece :: Key ReasoningAttempt -> Text

ToHttpApiData (Key ReasoningAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key ReasoningAttempt -> Text

toEncodedUrlPiece :: Key ReasoningAttempt -> Builder

toHeader :: Key ReasoningAttempt -> ByteString

toQueryParam :: Key ReasoningAttempt -> Text

data EntityField ReasoningAttempt typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

newtype Key ReasoningAttempt = ReasoningAttemptKey {}
type PersistEntityBackend ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ReasoningAttempt = SqlBackend
data Unique ReasoningAttempt Source # 
Instance details

Defined in Persistence.Schema

data Unique ReasoningAttempt

data ProofAttempt Source #

Instances

Instances details
PersistEntity ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ProofAttempt

data Key ProofAttempt

data EntityField ProofAttempt :: Type -> Type

data Unique ProofAttempt

Methods

keyToValues :: Key ProofAttempt -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ProofAttempt)

persistIdField :: EntityField ProofAttempt (Key ProofAttempt)

entityDef :: Monad m => m ProofAttempt -> EntityDef

persistFieldDef :: EntityField ProofAttempt typ -> FieldDef

toPersistFields :: ProofAttempt -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ProofAttempt

persistUniqueKeys :: ProofAttempt -> [Unique ProofAttempt]

persistUniqueToFieldNames :: Unique ProofAttempt -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ProofAttempt -> [PersistValue]

fieldLens :: EntityField ProofAttempt field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ProofAttempt -> f (Entity ProofAttempt)

PersistField ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ProofAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text ProofAttempt

(TypeError (MultipleUniqueKeysError ProofAttempt) :: Constraint) => AtLeastOneUniqueKey ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: ProofAttempt -> NonEmpty (Unique ProofAttempt)

(TypeError (NoUniqueKeysError ProofAttempt) :: Constraint) => OnlyOneUniqueKey ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ProofAttempt -> SqlType

(PersistQuery backend, PersistEntityBackend ProofAttempt ~ BaseBackend backend) => DeleteCascade ProofAttempt backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ProofAttempt -> ReaderT backend m ()

ToBackendKey SqlBackend ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ProofAttempt -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ProofAttempt

Eq (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key ProofAttempt -> Key ProofAttempt -> Bool

(/=) :: Key ProofAttempt -> Key ProofAttempt -> Bool

Ord (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key ProofAttempt -> Key ProofAttempt -> Ordering

(<) :: Key ProofAttempt -> Key ProofAttempt -> Bool

(<=) :: Key ProofAttempt -> Key ProofAttempt -> Bool

(>) :: Key ProofAttempt -> Key ProofAttempt -> Bool

(>=) :: Key ProofAttempt -> Key ProofAttempt -> Bool

max :: Key ProofAttempt -> Key ProofAttempt -> Key ProofAttempt

min :: Key ProofAttempt -> Key ProofAttempt -> Key ProofAttempt

Read (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ProofAttempt)

readList :: ReadS [Key ProofAttempt]

readPrec :: ReadPrec (Key ProofAttempt)

readListPrec :: ReadPrec [Key ProofAttempt]

Show (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ProofAttempt -> ShowS

show :: Key ProofAttempt -> String

showList :: [Key ProofAttempt] -> ShowS

FromJSON (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ProofAttempt)

parseJSONList :: Value -> Parser [Key ProofAttempt]

ToJSON (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key ProofAttempt -> Value

toEncoding :: Key ProofAttempt -> Encoding

toJSONList :: [Key ProofAttempt] -> Value

toEncodingList :: [Key ProofAttempt] -> Encoding

PersistField (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ProofAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ProofAttempt)

PersistFieldSql (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ProofAttempt) -> SqlType

FromHttpApiData (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ProofAttempt)

parseHeader :: ByteString -> Either Text (Key ProofAttempt)

parseQueryParam :: Text -> Either Text (Key ProofAttempt)

PathPiece (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ProofAttempt)

toPathPiece :: Key ProofAttempt -> Text

ToHttpApiData (Key ProofAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key ProofAttempt -> Text

toEncodedUrlPiece :: Key ProofAttempt -> Builder

toHeader :: Key ProofAttempt -> ByteString

toQueryParam :: Key ProofAttempt -> Text

data EntityField ProofAttempt typ Source # 
Instance details

Defined in Persistence.Schema

data EntityField ProofAttempt typ
newtype Key ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

newtype Key ProofAttempt = ProofAttemptKey {}
type PersistEntityBackend ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ProofAttempt = SqlBackend
data Unique ProofAttempt Source # 
Instance details

Defined in Persistence.Schema

data Unique ProofAttempt

data PremiseSelection Source #

Instances

Instances details
Show PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> PremiseSelection -> ShowS

show :: PremiseSelection -> String

showList :: [PremiseSelection] -> ShowS

PersistEntity PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend PremiseSelection

data Key PremiseSelection

data EntityField PremiseSelection :: Type -> Type

data Unique PremiseSelection

Methods

keyToValues :: Key PremiseSelection -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key PremiseSelection)

persistIdField :: EntityField PremiseSelection (Key PremiseSelection)

entityDef :: Monad m => m PremiseSelection -> EntityDef

persistFieldDef :: EntityField PremiseSelection typ -> FieldDef

toPersistFields :: PremiseSelection -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text PremiseSelection

persistUniqueKeys :: PremiseSelection -> [Unique PremiseSelection]

persistUniqueToFieldNames :: Unique PremiseSelection -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique PremiseSelection -> [PersistValue]

fieldLens :: EntityField PremiseSelection field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity PremiseSelection -> f (Entity PremiseSelection)

PersistField PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: PremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text PremiseSelection

(TypeError (MultipleUniqueKeysError PremiseSelection) :: Constraint) => AtLeastOneUniqueKey PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: PremiseSelection -> NonEmpty (Unique PremiseSelection)

(TypeError (NoUniqueKeysError PremiseSelection) :: Constraint) => OnlyOneUniqueKey PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy PremiseSelection -> SqlType

(PersistQuery backend, PersistEntityBackend PremiseSelection ~ BaseBackend backend) => DeleteCascade PremiseSelection backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key PremiseSelection -> ReaderT backend m ()

ToBackendKey SqlBackend PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key PremiseSelection -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key PremiseSelection

Eq (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key PremiseSelection -> Key PremiseSelection -> Bool

(/=) :: Key PremiseSelection -> Key PremiseSelection -> Bool

Ord (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Read (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key PremiseSelection)

readList :: ReadS [Key PremiseSelection]

readPrec :: ReadPrec (Key PremiseSelection)

readListPrec :: ReadPrec [Key PremiseSelection]

Show (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key PremiseSelection -> ShowS

show :: Key PremiseSelection -> String

showList :: [Key PremiseSelection] -> ShowS

FromJSON (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key PremiseSelection)

parseJSONList :: Value -> Parser [Key PremiseSelection]

ToJSON (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key PremiseSelection -> Value

toEncoding :: Key PremiseSelection -> Encoding

toJSONList :: [Key PremiseSelection] -> Value

toEncodingList :: [Key PremiseSelection] -> Encoding

PersistField (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key PremiseSelection -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key PremiseSelection)

PersistFieldSql (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key PremiseSelection) -> SqlType

FromHttpApiData (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key PremiseSelection)

parseHeader :: ByteString -> Either Text (Key PremiseSelection)

parseQueryParam :: Text -> Either Text (Key PremiseSelection)

PathPiece (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key PremiseSelection)

toPathPiece :: Key PremiseSelection -> Text

ToHttpApiData (Key PremiseSelection) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key PremiseSelection -> Text

toEncodedUrlPiece :: Key PremiseSelection -> Builder

toHeader :: Key PremiseSelection -> ByteString

toQueryParam :: Key PremiseSelection -> Text

data EntityField PremiseSelection typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

newtype Key PremiseSelection = PremiseSelectionKey {}
type PersistEntityBackend PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend PremiseSelection = SqlBackend
data Unique PremiseSelection Source # 
Instance details

Defined in Persistence.Schema

data Unique PremiseSelection

data PremiseSelectedSentence Source #

Instances

Instances details
Show PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

PersistEntity PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend PremiseSelectedSentence

data Key PremiseSelectedSentence

data EntityField PremiseSelectedSentence :: Type -> Type

data Unique PremiseSelectedSentence

Methods

keyToValues :: Key PremiseSelectedSentence -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key PremiseSelectedSentence)

persistIdField :: EntityField PremiseSelectedSentence (Key PremiseSelectedSentence)

entityDef :: Monad m => m PremiseSelectedSentence -> EntityDef

persistFieldDef :: EntityField PremiseSelectedSentence typ -> FieldDef

toPersistFields :: PremiseSelectedSentence -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text PremiseSelectedSentence

persistUniqueKeys :: PremiseSelectedSentence -> [Unique PremiseSelectedSentence]

persistUniqueToFieldNames :: Unique PremiseSelectedSentence -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique PremiseSelectedSentence -> [PersistValue]

fieldLens :: EntityField PremiseSelectedSentence field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity PremiseSelectedSentence -> f (Entity PremiseSelectedSentence)

PersistField PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: PremiseSelectedSentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text PremiseSelectedSentence

(TypeError (MultipleUniqueKeysError PremiseSelectedSentence) :: Constraint) => AtLeastOneUniqueKey PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError PremiseSelectedSentence) :: Constraint) => OnlyOneUniqueKey PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy PremiseSelectedSentence -> SqlType

(PersistQuery backend, PersistEntityBackend PremiseSelectedSentence ~ BaseBackend backend) => DeleteCascade PremiseSelectedSentence backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key PremiseSelectedSentence -> ReaderT backend m ()

Eq (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Read (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Show (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key PremiseSelectedSentence -> ShowS

show :: Key PremiseSelectedSentence -> String

showList :: [Key PremiseSelectedSentence] -> ShowS

Generic (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type Rep (Key PremiseSelectedSentence) :: Type -> Type

FromJSON (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key PremiseSelectedSentence)

parseJSONList :: Value -> Parser [Key PremiseSelectedSentence]

ToJSON (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

PersistField (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key PremiseSelectedSentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key PremiseSelectedSentence)

PersistFieldSql (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key PremiseSelectedSentence) -> SqlType

data EntityField PremiseSelectedSentence typ Source # 
Instance details

Defined in Persistence.Schema

data Key PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend PremiseSelectedSentence = SqlBackend
data Unique PremiseSelectedSentence Source # 
Instance details

Defined in Persistence.Schema

type Rep (Key PremiseSelectedSentence) Source # 
Instance details

Defined in Persistence.Schema

type Rep (Key PremiseSelectedSentence) = D1 ('MetaData "Key" "Persistence.Schema" "main" 'False) (C1 ('MetaCons "PremiseSelectedSentenceKey" 'PrefixI 'True) (S1 ('MetaSel ('Just "premiseSelectedSentenceKeypremiseId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 LocIdBaseId) :*: S1 ('MetaSel ('Just "premiseSelectedSentenceKeypremiseSelectionId") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 PremiseSelectionId)))

data ConsistencyCheckAttempt Source #

Instances

Instances details
PersistEntity ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ConsistencyCheckAttempt

data Key ConsistencyCheckAttempt

data EntityField ConsistencyCheckAttempt :: Type -> Type

data Unique ConsistencyCheckAttempt

Methods

keyToValues :: Key ConsistencyCheckAttempt -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ConsistencyCheckAttempt)

persistIdField :: EntityField ConsistencyCheckAttempt (Key ConsistencyCheckAttempt)

entityDef :: Monad m => m ConsistencyCheckAttempt -> EntityDef

persistFieldDef :: EntityField ConsistencyCheckAttempt typ -> FieldDef

toPersistFields :: ConsistencyCheckAttempt -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ConsistencyCheckAttempt

persistUniqueKeys :: ConsistencyCheckAttempt -> [Unique ConsistencyCheckAttempt]

persistUniqueToFieldNames :: Unique ConsistencyCheckAttempt -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ConsistencyCheckAttempt -> [PersistValue]

fieldLens :: EntityField ConsistencyCheckAttempt field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ConsistencyCheckAttempt -> f (Entity ConsistencyCheckAttempt)

PersistField ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ConsistencyCheckAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text ConsistencyCheckAttempt

(TypeError (MultipleUniqueKeysError ConsistencyCheckAttempt) :: Constraint) => AtLeastOneUniqueKey ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError ConsistencyCheckAttempt) :: Constraint) => OnlyOneUniqueKey ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ConsistencyCheckAttempt -> SqlType

(PersistQuery backend, PersistEntityBackend ConsistencyCheckAttempt ~ BaseBackend backend) => DeleteCascade ConsistencyCheckAttempt backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ConsistencyCheckAttempt -> ReaderT backend m ()

ToBackendKey SqlBackend ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ConsistencyCheckAttempt -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ConsistencyCheckAttempt

Eq (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Show (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ConsistencyCheckAttempt -> ShowS

show :: Key ConsistencyCheckAttempt -> String

showList :: [Key ConsistencyCheckAttempt] -> ShowS

FromJSON (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ConsistencyCheckAttempt)

parseJSONList :: Value -> Parser [Key ConsistencyCheckAttempt]

ToJSON (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

PersistField (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ConsistencyCheckAttempt -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ConsistencyCheckAttempt)

PersistFieldSql (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ConsistencyCheckAttempt) -> SqlType

FromHttpApiData (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ConsistencyCheckAttempt)

parseHeader :: ByteString -> Either Text (Key ConsistencyCheckAttempt)

parseQueryParam :: Text -> Either Text (Key ConsistencyCheckAttempt)

PathPiece (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ConsistencyCheckAttempt)

toPathPiece :: Key ConsistencyCheckAttempt -> Text

ToHttpApiData (Key ConsistencyCheckAttempt) Source # 
Instance details

Defined in Persistence.Schema

data EntityField ConsistencyCheckAttempt typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ConsistencyCheckAttempt = SqlBackend
data Unique ConsistencyCheckAttempt Source # 
Instance details

Defined in Persistence.Schema

data ProofAttemptUsedSentence Source #

Instances

Instances details
Show ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

PersistEntity ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ProofAttemptUsedSentence

data Key ProofAttemptUsedSentence

data EntityField ProofAttemptUsedSentence :: Type -> Type

data Unique ProofAttemptUsedSentence

Methods

keyToValues :: Key ProofAttemptUsedSentence -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ProofAttemptUsedSentence)

persistIdField :: EntityField ProofAttemptUsedSentence (Key ProofAttemptUsedSentence)

entityDef :: Monad m => m ProofAttemptUsedSentence -> EntityDef

persistFieldDef :: EntityField ProofAttemptUsedSentence typ -> FieldDef

toPersistFields :: ProofAttemptUsedSentence -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ProofAttemptUsedSentence

persistUniqueKeys :: ProofAttemptUsedSentence -> [Unique ProofAttemptUsedSentence]

persistUniqueToFieldNames :: Unique ProofAttemptUsedSentence -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ProofAttemptUsedSentence -> [PersistValue]

fieldLens :: EntityField ProofAttemptUsedSentence field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ProofAttemptUsedSentence -> f (Entity ProofAttemptUsedSentence)

PersistField ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ProofAttemptUsedSentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text ProofAttemptUsedSentence

(TypeError (MultipleUniqueKeysError ProofAttemptUsedSentence) :: Constraint) => AtLeastOneUniqueKey ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

(TypeError (NoUniqueKeysError ProofAttemptUsedSentence) :: Constraint) => OnlyOneUniqueKey ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ProofAttemptUsedSentence -> SqlType

(PersistQuery backend, PersistEntityBackend ProofAttemptUsedSentence ~ BaseBackend backend) => DeleteCascade ProofAttemptUsedSentence backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ProofAttemptUsedSentence -> ReaderT backend m ()

ToBackendKey SqlBackend ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ProofAttemptUsedSentence -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ProofAttemptUsedSentence

Eq (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Ord (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Read (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Show (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ProofAttemptUsedSentence -> ShowS

show :: Key ProofAttemptUsedSentence -> String

showList :: [Key ProofAttemptUsedSentence] -> ShowS

FromJSON (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ProofAttemptUsedSentence)

parseJSONList :: Value -> Parser [Key ProofAttemptUsedSentence]

ToJSON (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

PersistField (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ProofAttemptUsedSentence -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ProofAttemptUsedSentence)

PersistFieldSql (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ProofAttemptUsedSentence) -> SqlType

FromHttpApiData (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ProofAttemptUsedSentence)

parseHeader :: ByteString -> Either Text (Key ProofAttemptUsedSentence)

parseQueryParam :: Text -> Either Text (Key ProofAttemptUsedSentence)

PathPiece (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

ToHttpApiData (Key ProofAttemptUsedSentence) Source # 
Instance details

Defined in Persistence.Schema

data EntityField ProofAttemptUsedSentence typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ProofAttemptUsedSentence = SqlBackend
data Unique ProofAttemptUsedSentence Source # 
Instance details

Defined in Persistence.Schema

data GeneratedAxiom Source #

Instances

Instances details
Show GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> GeneratedAxiom -> ShowS

show :: GeneratedAxiom -> String

showList :: [GeneratedAxiom] -> ShowS

PersistEntity GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend GeneratedAxiom

data Key GeneratedAxiom

data EntityField GeneratedAxiom :: Type -> Type

data Unique GeneratedAxiom

Methods

keyToValues :: Key GeneratedAxiom -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key GeneratedAxiom)

persistIdField :: EntityField GeneratedAxiom (Key GeneratedAxiom)

entityDef :: Monad m => m GeneratedAxiom -> EntityDef

persistFieldDef :: EntityField GeneratedAxiom typ -> FieldDef

toPersistFields :: GeneratedAxiom -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text GeneratedAxiom

persistUniqueKeys :: GeneratedAxiom -> [Unique GeneratedAxiom]

persistUniqueToFieldNames :: Unique GeneratedAxiom -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique GeneratedAxiom -> [PersistValue]

fieldLens :: EntityField GeneratedAxiom field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity GeneratedAxiom -> f (Entity GeneratedAxiom)

PersistField GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: GeneratedAxiom -> PersistValue

fromPersistValue :: PersistValue -> Either Text GeneratedAxiom

(TypeError (MultipleUniqueKeysError GeneratedAxiom) :: Constraint) => AtLeastOneUniqueKey GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: GeneratedAxiom -> NonEmpty (Unique GeneratedAxiom)

(TypeError (NoUniqueKeysError GeneratedAxiom) :: Constraint) => OnlyOneUniqueKey GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy GeneratedAxiom -> SqlType

(PersistQuery backend, PersistEntityBackend GeneratedAxiom ~ BaseBackend backend) => DeleteCascade GeneratedAxiom backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key GeneratedAxiom -> ReaderT backend m ()

ToBackendKey SqlBackend GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key GeneratedAxiom -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key GeneratedAxiom

Eq (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

(/=) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

Ord (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key GeneratedAxiom -> Key GeneratedAxiom -> Ordering

(<) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

(<=) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

(>) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

(>=) :: Key GeneratedAxiom -> Key GeneratedAxiom -> Bool

max :: Key GeneratedAxiom -> Key GeneratedAxiom -> Key GeneratedAxiom

min :: Key GeneratedAxiom -> Key GeneratedAxiom -> Key GeneratedAxiom

Read (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key GeneratedAxiom)

readList :: ReadS [Key GeneratedAxiom]

readPrec :: ReadPrec (Key GeneratedAxiom)

readListPrec :: ReadPrec [Key GeneratedAxiom]

Show (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key GeneratedAxiom -> ShowS

show :: Key GeneratedAxiom -> String

showList :: [Key GeneratedAxiom] -> ShowS

FromJSON (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key GeneratedAxiom)

parseJSONList :: Value -> Parser [Key GeneratedAxiom]

ToJSON (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key GeneratedAxiom -> Value

toEncoding :: Key GeneratedAxiom -> Encoding

toJSONList :: [Key GeneratedAxiom] -> Value

toEncodingList :: [Key GeneratedAxiom] -> Encoding

PersistField (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key GeneratedAxiom -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key GeneratedAxiom)

PersistFieldSql (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key GeneratedAxiom) -> SqlType

FromHttpApiData (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key GeneratedAxiom)

parseHeader :: ByteString -> Either Text (Key GeneratedAxiom)

parseQueryParam :: Text -> Either Text (Key GeneratedAxiom)

PathPiece (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key GeneratedAxiom)

toPathPiece :: Key GeneratedAxiom -> Text

ToHttpApiData (Key GeneratedAxiom) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key GeneratedAxiom -> Text

toEncodedUrlPiece :: Key GeneratedAxiom -> Builder

toHeader :: Key GeneratedAxiom -> ByteString

toQueryParam :: Key GeneratedAxiom -> Text

data EntityField GeneratedAxiom typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

newtype Key GeneratedAxiom = GeneratedAxiomKey {}
type PersistEntityBackend GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend GeneratedAxiom = SqlBackend
data Unique GeneratedAxiom Source # 
Instance details

Defined in Persistence.Schema

data Unique GeneratedAxiom

data ReasonerOutput Source #

Instances

Instances details
Show ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> ReasonerOutput -> ShowS

show :: ReasonerOutput -> String

showList :: [ReasonerOutput] -> ShowS

PersistEntity ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Associated Types

type PersistEntityBackend ReasonerOutput

data Key ReasonerOutput

data EntityField ReasonerOutput :: Type -> Type

data Unique ReasonerOutput

Methods

keyToValues :: Key ReasonerOutput -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key ReasonerOutput)

persistIdField :: EntityField ReasonerOutput (Key ReasonerOutput)

entityDef :: Monad m => m ReasonerOutput -> EntityDef

persistFieldDef :: EntityField ReasonerOutput typ -> FieldDef

toPersistFields :: ReasonerOutput -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text ReasonerOutput

persistUniqueKeys :: ReasonerOutput -> [Unique ReasonerOutput]

persistUniqueToFieldNames :: Unique ReasonerOutput -> [(HaskellName, DBName)]

persistUniqueToValues :: Unique ReasonerOutput -> [PersistValue]

fieldLens :: EntityField ReasonerOutput field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity ReasonerOutput -> f (Entity ReasonerOutput)

PersistField ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: ReasonerOutput -> PersistValue

fromPersistValue :: PersistValue -> Either Text ReasonerOutput

(TypeError (MultipleUniqueKeysError ReasonerOutput) :: Constraint) => AtLeastOneUniqueKey ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Methods

requireUniquesP :: ReasonerOutput -> NonEmpty (Unique ReasonerOutput)

(TypeError (NoUniqueKeysError ReasonerOutput) :: Constraint) => OnlyOneUniqueKey ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

PersistFieldSql ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy ReasonerOutput -> SqlType

(PersistQuery backend, PersistEntityBackend ReasonerOutput ~ BaseBackend backend) => DeleteCascade ReasonerOutput backend Source # 
Instance details

Defined in Persistence.Schema

Methods

deleteCascade :: forall (m :: Type -> Type). MonadIO m => Key ReasonerOutput -> ReaderT backend m ()

ToBackendKey SqlBackend ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

Methods

toBackendKey :: Key ReasonerOutput -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key ReasonerOutput

Eq (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

(==) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

(/=) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

Ord (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

compare :: Key ReasonerOutput -> Key ReasonerOutput -> Ordering

(<) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

(<=) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

(>) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

(>=) :: Key ReasonerOutput -> Key ReasonerOutput -> Bool

max :: Key ReasonerOutput -> Key ReasonerOutput -> Key ReasonerOutput

min :: Key ReasonerOutput -> Key ReasonerOutput -> Key ReasonerOutput

Read (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

readsPrec :: Int -> ReadS (Key ReasonerOutput)

readList :: ReadS [Key ReasonerOutput]

readPrec :: ReadPrec (Key ReasonerOutput)

readListPrec :: ReadPrec [Key ReasonerOutput]

Show (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

showsPrec :: Int -> Key ReasonerOutput -> ShowS

show :: Key ReasonerOutput -> String

showList :: [Key ReasonerOutput] -> ShowS

FromJSON (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseJSON :: Value -> Parser (Key ReasonerOutput)

parseJSONList :: Value -> Parser [Key ReasonerOutput]

ToJSON (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

toJSON :: Key ReasonerOutput -> Value

toEncoding :: Key ReasonerOutput -> Encoding

toJSONList :: [Key ReasonerOutput] -> Value

toEncodingList :: [Key ReasonerOutput] -> Encoding

PersistField (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

toPersistValue :: Key ReasonerOutput -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key ReasonerOutput)

PersistFieldSql (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

sqlType :: Proxy (Key ReasonerOutput) -> SqlType

FromHttpApiData (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

parseUrlPiece :: Text -> Either Text (Key ReasonerOutput)

parseHeader :: ByteString -> Either Text (Key ReasonerOutput)

parseQueryParam :: Text -> Either Text (Key ReasonerOutput)

PathPiece (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

fromPathPiece :: Text -> Maybe (Key ReasonerOutput)

toPathPiece :: Key ReasonerOutput -> Text

ToHttpApiData (Key ReasonerOutput) Source # 
Instance details

Defined in Persistence.Schema

Methods

toUrlPiece :: Key ReasonerOutput -> Text

toEncodedUrlPiece :: Key ReasonerOutput -> Builder

toHeader :: Key ReasonerOutput -> ByteString

toQueryParam :: Key ReasonerOutput -> Text

data EntityField ReasonerOutput typ Source # 
Instance details

Defined in Persistence.Schema

newtype Key ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

newtype Key ReasonerOutput = ReasonerOutputKey {}
type PersistEntityBackend ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

type PersistEntityBackend ReasonerOutput = SqlBackend
data Unique ReasonerOutput Source # 
Instance details

Defined in Persistence.Schema

data Unique ReasonerOutput

migrateAll :: Migration Source #