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

LongIdentifierTest

Documentation

data TableAnExtremelyFantasticallySuperLongNameParent Source #

Instances

Instances details
PersistFieldSql TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

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

Defined in LongIdentifierTest

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

Defined in LongIdentifierTest

PersistEntity TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

Methods

keyToValues :: Key TableAnExtremelyFantasticallySuperLongNameParent -> [PersistValue] #

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

persistIdField :: EntityField TableAnExtremelyFantasticallySuperLongNameParent (Key TableAnExtremelyFantasticallySuperLongNameParent) #

entityDef :: proxy TableAnExtremelyFantasticallySuperLongNameParent -> EntityDef #

persistFieldDef :: EntityField TableAnExtremelyFantasticallySuperLongNameParent typ -> FieldDef #

toPersistFields :: TableAnExtremelyFantasticallySuperLongNameParent -> [PersistValue] #

fromPersistValues :: [PersistValue] -> Either Text TableAnExtremelyFantasticallySuperLongNameParent #

tabulateEntityA :: Applicative f => (forall a. EntityField TableAnExtremelyFantasticallySuperLongNameParent a -> f a) -> f (Entity TableAnExtremelyFantasticallySuperLongNameParent) #

persistUniqueKeys :: TableAnExtremelyFantasticallySuperLongNameParent -> [Unique TableAnExtremelyFantasticallySuperLongNameParent] #

persistUniqueToFieldNames :: Unique TableAnExtremelyFantasticallySuperLongNameParent -> NonEmpty (FieldNameHS, FieldNameDB) #

persistUniqueToValues :: Unique TableAnExtremelyFantasticallySuperLongNameParent -> [PersistValue] #

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

keyFromRecordM :: Maybe (TableAnExtremelyFantasticallySuperLongNameParent -> Key TableAnExtremelyFantasticallySuperLongNameParent) #

SafeToInsert TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

PersistField TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

ToBackendKey SqlBackend TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

SymbolToField "columnAnExtremelyFantasticallySuperLongNameParentId" TableAnExtremelyFantasticallySuperLongNameChild TableAnExtremelyFantasticallySuperLongNameParentId Source # 
Instance details

Defined in LongIdentifierTest

SymbolToField "field1" TableAnExtremelyFantasticallySuperLongNameParent Int Source # 
Instance details

Defined in LongIdentifierTest

SymbolToField "id" TableAnExtremelyFantasticallySuperLongNameParent (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

Eq (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

Ord (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

Read (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

Show (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

ToJSON (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

FromJSON (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

ToHttpApiData (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

FromHttpApiData (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

PathPiece (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

PersistFieldSql (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

PersistField (Key TableAnExtremelyFantasticallySuperLongNameParent) Source # 
Instance details

Defined in LongIdentifierTest

data Unique TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

data EntityField TableAnExtremelyFantasticallySuperLongNameParent typ Source # 
Instance details

Defined in LongIdentifierTest

newtype Key TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

type PersistEntityBackend TableAnExtremelyFantasticallySuperLongNameParent Source # 
Instance details

Defined in LongIdentifierTest

data TableAnExtremelyFantasticallySuperLongNameChild Source #

Instances

Instances details
PersistFieldSql TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

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

Defined in LongIdentifierTest

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

Defined in LongIdentifierTest

PersistEntity TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

Methods

keyToValues :: Key TableAnExtremelyFantasticallySuperLongNameChild -> [PersistValue] #

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

persistIdField :: EntityField TableAnExtremelyFantasticallySuperLongNameChild (Key TableAnExtremelyFantasticallySuperLongNameChild) #

entityDef :: proxy TableAnExtremelyFantasticallySuperLongNameChild -> EntityDef #

persistFieldDef :: EntityField TableAnExtremelyFantasticallySuperLongNameChild typ -> FieldDef #

toPersistFields :: TableAnExtremelyFantasticallySuperLongNameChild -> [PersistValue] #

fromPersistValues :: [PersistValue] -> Either Text TableAnExtremelyFantasticallySuperLongNameChild #

tabulateEntityA :: Applicative f => (forall a. EntityField TableAnExtremelyFantasticallySuperLongNameChild a -> f a) -> f (Entity TableAnExtremelyFantasticallySuperLongNameChild) #

persistUniqueKeys :: TableAnExtremelyFantasticallySuperLongNameChild -> [Unique TableAnExtremelyFantasticallySuperLongNameChild] #

persistUniqueToFieldNames :: Unique TableAnExtremelyFantasticallySuperLongNameChild -> NonEmpty (FieldNameHS, FieldNameDB) #

persistUniqueToValues :: Unique TableAnExtremelyFantasticallySuperLongNameChild -> [PersistValue] #

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

keyFromRecordM :: Maybe (TableAnExtremelyFantasticallySuperLongNameChild -> Key TableAnExtremelyFantasticallySuperLongNameChild) #

SafeToInsert TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

PersistField TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

ToBackendKey SqlBackend TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

SymbolToField "columnAnExtremelyFantasticallySuperLongNameParentId" TableAnExtremelyFantasticallySuperLongNameChild TableAnExtremelyFantasticallySuperLongNameParentId Source # 
Instance details

Defined in LongIdentifierTest

SymbolToField "id" TableAnExtremelyFantasticallySuperLongNameChild (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

Eq (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

Ord (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

Read (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

Show (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

ToJSON (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

FromJSON (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

ToHttpApiData (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

FromHttpApiData (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

PathPiece (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

PersistFieldSql (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

PersistField (Key TableAnExtremelyFantasticallySuperLongNameChild) Source # 
Instance details

Defined in LongIdentifierTest

data Unique TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

data EntityField TableAnExtremelyFantasticallySuperLongNameChild typ Source # 
Instance details

Defined in LongIdentifierTest

newtype Key TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest

type PersistEntityBackend TableAnExtremelyFantasticallySuperLongNameChild Source # 
Instance details

Defined in LongIdentifierTest