{-# LANGUAGE DeriveGeneric #-}
module PersistTestPetCollarType where

import Data.Aeson
import Data.Text (Text)
import GHC.Generics

import Database.Persist.TH

data PetCollar = PetCollar {PetCollar -> Text
tag :: Text, PetCollar -> Bool
bell :: Bool}
    deriving ((forall x. PetCollar -> Rep PetCollar x)
-> (forall x. Rep PetCollar x -> PetCollar) -> Generic PetCollar
forall x. Rep PetCollar x -> PetCollar
forall x. PetCollar -> Rep PetCollar x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep PetCollar x -> PetCollar
$cfrom :: forall x. PetCollar -> Rep PetCollar x
Generic, PetCollar -> PetCollar -> Bool
(PetCollar -> PetCollar -> Bool)
-> (PetCollar -> PetCollar -> Bool) -> Eq PetCollar
forall a. (a -> a -> Bool) -> (a -> a -> Bool) -> Eq a
/= :: PetCollar -> PetCollar -> Bool
$c/= :: PetCollar -> PetCollar -> Bool
== :: PetCollar -> PetCollar -> Bool
$c== :: PetCollar -> PetCollar -> Bool
Eq, Int -> PetCollar -> ShowS
[PetCollar] -> ShowS
PetCollar -> String
(Int -> PetCollar -> ShowS)
-> (PetCollar -> String)
-> ([PetCollar] -> ShowS)
-> Show PetCollar
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [PetCollar] -> ShowS
$cshowList :: [PetCollar] -> ShowS
show :: PetCollar -> String
$cshow :: PetCollar -> String
showsPrec :: Int -> PetCollar -> ShowS
$cshowsPrec :: Int -> PetCollar -> ShowS
Show)
instance ToJSON PetCollar
instance FromJSON PetCollar

derivePersistFieldJSON "PetCollar"