persistent-test-2.12.0.0: Tests for Persistent
Safe HaskellNone
LanguageHaskell2010

EntityEmbedTest

Documentation

data ARecordGeneric backend Source #

Constructors

ARecord 

Fields

Instances

Instances details
PersistStore backend => ToBackendKey backend (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

toBackendKey :: Key (ARecordGeneric backend) -> BackendKey backend #

fromBackendKey :: BackendKey backend -> Key (ARecordGeneric backend) #

SymbolToField "name" (ARecordGeneric backend) Text Source # 
Instance details

Defined in EntityEmbedTest

Eq (BackendKey backend) => Eq (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Methods

(==) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

(/=) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

Eq (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

(==) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

(/=) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

Ord (BackendKey backend) => Ord (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Methods

compare :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Ordering #

(<) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

(<=) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

(>) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

(>=) :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Bool #

max :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) #

min :: Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) -> Key (ARecordGeneric backend) #

Ord (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

compare :: ARecordGeneric backend -> ARecordGeneric backend -> Ordering #

(<) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

(<=) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

(>) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

(>=) :: ARecordGeneric backend -> ARecordGeneric backend -> Bool #

max :: ARecordGeneric backend -> ARecordGeneric backend -> ARecordGeneric backend #

min :: ARecordGeneric backend -> ARecordGeneric backend -> ARecordGeneric backend #

Read (BackendKey backend) => Read (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Read (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Show (BackendKey backend) => Show (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Methods

showsPrec :: Int -> Key (ARecordGeneric backend) -> ShowS #

show :: Key (ARecordGeneric backend) -> String #

showList :: [Key (ARecordGeneric backend)] -> ShowS #

Show (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

showsPrec :: Int -> ARecordGeneric backend -> ShowS #

show :: ARecordGeneric backend -> String #

showList :: [ARecordGeneric backend] -> ShowS #

ToJSON (BackendKey backend) => ToJSON (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

FromJSON (BackendKey backend) => FromJSON (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

ToHttpApiData (BackendKey backend) => ToHttpApiData (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

FromHttpApiData (BackendKey backend) => FromHttpApiData (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

PathPiece (BackendKey backend) => PathPiece (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Methods

fromPathPiece :: Text -> Maybe (Key (ARecordGeneric backend)) #

toPathPiece :: Key (ARecordGeneric backend) -> Text #

PersistFieldSql (BackendKey backend) => PersistFieldSql (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

Methods

sqlType :: Proxy (Key (ARecordGeneric backend)) -> SqlType #

PersistStore backend => PersistFieldSql (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

sqlType :: Proxy (ARecordGeneric backend) -> SqlType #

(TypeError (NoUniqueKeysError (ARecordGeneric backend)) :: Constraint, PersistStoreWrite backend) => OnlyOneUniqueKey (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Methods

onlyUniqueP :: ARecordGeneric backend -> Unique (ARecordGeneric backend) #

(TypeError (MultipleUniqueKeysError (ARecordGeneric backend)) :: Constraint, PersistStoreWrite backend) => AtLeastOneUniqueKey (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

PersistStore backend => PersistEntity (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

Associated Types

type PersistEntityBackend (ARecordGeneric backend) #

data Key (ARecordGeneric backend) #

data EntityField (ARecordGeneric backend) :: Type -> Type #

data Unique (ARecordGeneric backend) #

PersistField (BackendKey backend) => PersistField (Key (ARecordGeneric backend)) Source # 
Instance details

Defined in EntityEmbedTest

PersistStore backend => PersistField (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

data Unique (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

data Unique (ARecordGeneric backend)
data EntityField (ARecordGeneric backend) typ Source # 
Instance details

Defined in EntityEmbedTest

data EntityField (ARecordGeneric backend) typ
newtype Key (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

newtype Key (ARecordGeneric backend) = ARecordKey {}
type PersistEntityBackend (ARecordGeneric backend) Source # 
Instance details

Defined in EntityEmbedTest

type PersistEntityBackend (ARecordGeneric backend) = backend