persistent-test-2.0.0.3: Tests for Persistent

Safe HaskellNone
LanguageHaskell2010

CompositeTest

Documentation

data TestParent Source #

Instances

Eq TestParent Source # 
Show TestParent Source # 
PersistFieldSql TestParent Source # 
PersistEntity TestParent Source # 
PersistField TestParent Source # 
(PersistQuery backend, (~) * (PersistEntityBackend TestParent) (BaseBackend backend)) => DeleteCascade TestParent backend Source # 

Methods

deleteCascade :: MonadIO m => Key TestParent -> ReaderT * backend m () #

Eq (Key TestParent) Source # 
Ord (Key TestParent) Source # 
Read (Key TestParent) Source # 
Show (Key TestParent) Source # 
Generic (Key TestParent) Source # 

Associated Types

type Rep (Key TestParent) :: * -> * #

ToJSON (Key TestParent) Source # 
FromJSON (Key TestParent) Source # 
PersistFieldSql (Key TestParent) Source # 
PersistField (Key TestParent) Source # 
data Unique TestParent Source # 
data EntityField TestParent Source # 
data Key TestParent Source # 
type PersistEntityBackend TestParent Source # 
type Rep (Key TestParent) Source # 
type Rep (Key TestParent) = D1 * (MetaData "Key" "CompositeTest" "persistent-test-2.0.0.3-LyCw67o8qE43VKOeeZosJQ" False) (C1 * (MetaCons "TestParentKey" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "testParentKeyname") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String)) ((:*:) * (S1 * (MetaSel (Just Symbol "testParentKeyname2") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String)) (S1 * (MetaSel (Just Symbol "testParentKeyage") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * Int)))))

data TestChild Source #

Instances

Eq TestChild Source # 
Show TestChild Source # 
PersistFieldSql TestChild Source # 
PersistEntity TestChild Source # 
PersistField TestChild Source # 
(PersistQuery backend, (~) * (PersistEntityBackend TestChild) (BaseBackend backend)) => DeleteCascade TestChild backend Source # 

Methods

deleteCascade :: MonadIO m => Key TestChild -> ReaderT * backend m () #

ToBackendKey SqlBackend TestChild Source # 
Eq (Key TestChild) Source # 
Ord (Key TestChild) Source # 
Read (Key TestChild) Source # 
Show (Key TestChild) Source # 
ToJSON (Key TestChild) Source # 
FromJSON (Key TestChild) Source # 
ToHttpApiData (Key TestChild) Source # 
FromHttpApiData (Key TestChild) Source # 
PathPiece (Key TestChild) Source # 
PersistFieldSql (Key TestChild) Source # 
PersistField (Key TestChild) Source # 
data Unique TestChild Source # 
data EntityField TestChild Source # 
data Key TestChild Source # 
type PersistEntityBackend TestChild Source # 

data Tree Source #

Constructors

Tree 

Fields

Instances

PersistFieldSql Tree Source # 

Methods

sqlType :: Proxy * Tree -> SqlType #

PersistEntity Tree Source # 
PersistField Tree Source # 
(PersistQuery backend, (~) * (PersistEntityBackend Tree) (BaseBackend backend)) => DeleteCascade Tree backend Source # 

Methods

deleteCascade :: MonadIO m => Key Tree -> ReaderT * backend m () #

Eq (Key Tree) Source # 

Methods

(==) :: Key Tree -> Key Tree -> Bool #

(/=) :: Key Tree -> Key Tree -> Bool #

Ord (Key Tree) Source # 

Methods

compare :: Key Tree -> Key Tree -> Ordering #

(<) :: Key Tree -> Key Tree -> Bool #

(<=) :: Key Tree -> Key Tree -> Bool #

(>) :: Key Tree -> Key Tree -> Bool #

(>=) :: Key Tree -> Key Tree -> Bool #

max :: Key Tree -> Key Tree -> Key Tree #

min :: Key Tree -> Key Tree -> Key Tree #

Read (Key Tree) Source # 
Show (Key Tree) Source # 

Methods

showsPrec :: Int -> Key Tree -> ShowS #

show :: Key Tree -> String #

showList :: [Key Tree] -> ShowS #

ToJSON (Key Tree) Source # 
FromJSON (Key Tree) Source # 
ToHttpApiData (Key Tree) Source # 
FromHttpApiData (Key Tree) Source # 
PathPiece (Key Tree) Source # 
PersistFieldSql (Key Tree) Source # 

Methods

sqlType :: Proxy * (Key Tree) -> SqlType #

PersistField (Key Tree) Source # 
data Unique Tree Source # 
data EntityField Tree Source # 
data Key Tree Source # 
type PersistEntityBackend Tree Source # 

data Citizen Source #

Constructors

Citizen 

Instances

Eq Citizen Source # 

Methods

(==) :: Citizen -> Citizen -> Bool #

(/=) :: Citizen -> Citizen -> Bool #

Show Citizen Source # 
PersistFieldSql Citizen Source # 
PersistEntity Citizen Source # 
PersistField Citizen Source # 
(PersistQuery backend, (~) * (PersistEntityBackend Citizen) (BaseBackend backend)) => DeleteCascade Citizen backend Source # 

Methods

deleteCascade :: MonadIO m => Key Citizen -> ReaderT * backend m () #

ToBackendKey SqlBackend Citizen Source # 
Eq (Key Citizen) Source # 
Ord (Key Citizen) Source # 
Read (Key Citizen) Source # 
Show (Key Citizen) Source # 
ToJSON (Key Citizen) Source # 
FromJSON (Key Citizen) Source # 
ToHttpApiData (Key Citizen) Source # 
FromHttpApiData (Key Citizen) Source # 
PathPiece (Key Citizen) Source # 
PersistFieldSql (Key Citizen) Source # 

Methods

sqlType :: Proxy * (Key Citizen) -> SqlType #

PersistField (Key Citizen) Source # 
data Unique Citizen Source # 
data EntityField Citizen Source # 
data Key Citizen Source # 
type PersistEntityBackend Citizen Source # 

data Address Source #

Constructors

Address 

Instances

Eq Address Source # 

Methods

(==) :: Address -> Address -> Bool #

(/=) :: Address -> Address -> Bool #

Show Address Source # 
PersistFieldSql Address Source # 
PersistEntity Address Source # 
PersistField Address Source # 
(PersistQuery backend, (~) * (PersistEntityBackend Address) (BaseBackend backend)) => DeleteCascade Address backend Source # 

Methods

deleteCascade :: MonadIO m => Key Address -> ReaderT * backend m () #

ToBackendKey SqlBackend Address Source # 
Eq (Key Address) Source # 
Ord (Key Address) Source # 
Read (Key Address) Source # 
Show (Key Address) Source # 
ToJSON (Key Address) Source # 
FromJSON (Key Address) Source # 
ToHttpApiData (Key Address) Source # 
FromHttpApiData (Key Address) Source # 
PathPiece (Key Address) Source # 
PersistFieldSql (Key Address) Source # 

Methods

sqlType :: Proxy * (Key Address) -> SqlType #

PersistField (Key Address) Source # 
data Unique Address Source # 
data EntityField Address Source # 
data Key Address Source # 
type PersistEntityBackend Address Source # 

data CitizenAddress Source #

Instances

Eq CitizenAddress Source # 
Show CitizenAddress Source # 
PersistFieldSql CitizenAddress Source # 
PersistEntity CitizenAddress Source # 
PersistField CitizenAddress Source # 
(PersistQuery backend, (~) * (PersistEntityBackend CitizenAddress) (BaseBackend backend)) => DeleteCascade CitizenAddress backend Source # 

Methods

deleteCascade :: MonadIO m => Key CitizenAddress -> ReaderT * backend m () #

Eq (Key CitizenAddress) Source # 
Ord (Key CitizenAddress) Source # 
Read (Key CitizenAddress) Source # 
Show (Key CitizenAddress) Source # 
Generic (Key CitizenAddress) Source # 

Associated Types

type Rep (Key CitizenAddress) :: * -> * #

ToJSON (Key CitizenAddress) Source # 
FromJSON (Key CitizenAddress) Source # 
PersistFieldSql (Key CitizenAddress) Source # 
PersistField (Key CitizenAddress) Source # 
data Unique CitizenAddress Source # 
data EntityField CitizenAddress Source # 
data Key CitizenAddress Source # 
type PersistEntityBackend CitizenAddress Source # 
type Rep (Key CitizenAddress) Source # 
type Rep (Key CitizenAddress) = D1 * (MetaData "Key" "CompositeTest" "persistent-test-2.0.0.3-LyCw67o8qE43VKOeeZosJQ" False) (C1 * (MetaCons "CitizenAddressKey" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "citizenAddressKeycitizen") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * CitizenId)) (S1 * (MetaSel (Just Symbol "citizenAddressKeyaddress") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * AddressId))))

data PrimaryCompositeWithOtherNullableFields Source #

Instances

Eq PrimaryCompositeWithOtherNullableFields Source # 
Show PrimaryCompositeWithOtherNullableFields Source # 
PersistFieldSql PrimaryCompositeWithOtherNullableFields Source # 
PersistEntity PrimaryCompositeWithOtherNullableFields Source # 
PersistField PrimaryCompositeWithOtherNullableFields Source # 
(PersistQuery backend, (~) * (PersistEntityBackend PrimaryCompositeWithOtherNullableFields) (BaseBackend backend)) => DeleteCascade PrimaryCompositeWithOtherNullableFields backend Source # 
Eq (Key PrimaryCompositeWithOtherNullableFields) Source # 
Ord (Key PrimaryCompositeWithOtherNullableFields) Source # 
Read (Key PrimaryCompositeWithOtherNullableFields) Source # 
Show (Key PrimaryCompositeWithOtherNullableFields) Source # 
Generic (Key PrimaryCompositeWithOtherNullableFields) Source # 
ToJSON (Key PrimaryCompositeWithOtherNullableFields) Source # 
FromJSON (Key PrimaryCompositeWithOtherNullableFields) Source # 
PersistFieldSql (Key PrimaryCompositeWithOtherNullableFields) Source # 
PersistField (Key PrimaryCompositeWithOtherNullableFields) Source # 
data Unique PrimaryCompositeWithOtherNullableFields Source # 
data EntityField PrimaryCompositeWithOtherNullableFields Source # 
data Key PrimaryCompositeWithOtherNullableFields Source # 
type PersistEntityBackend PrimaryCompositeWithOtherNullableFields Source # 
type Rep (Key PrimaryCompositeWithOtherNullableFields) Source # 
type Rep (Key PrimaryCompositeWithOtherNullableFields) = D1 * (MetaData "Key" "CompositeTest" "persistent-test-2.0.0.3-LyCw67o8qE43VKOeeZosJQ" False) (C1 * (MetaCons "PrimaryCompositeWithOtherNullableFieldsKey" PrefixI True) ((:*:) * (S1 * (MetaSel (Just Symbol "primaryCompositeWithOtherNullableFieldsKeyfoo") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String)) (S1 * (MetaSel (Just Symbol "primaryCompositeWithOtherNullableFieldsKeybar") NoSourceUnpackedness NoSourceStrictness DecidedLazy) (Rec0 * String))))

matchK :: (PersistField a, PersistEntity record) => Key record -> Either Text a Source #

matchK2 :: (PersistField a1, PersistField a, PersistEntity record, PersistEntity record2) => Key record -> Key record2 -> Either Text (a1, a) Source #