{-# LANGUAGE TemplateHaskell #-}
module Strive.Types.Comments
( CommentSummary (..),
)
where
import Data.Aeson.TH (deriveFromJSON)
import Data.Text (Text)
import Data.Time.Clock (UTCTime)
import Strive.Enums (ResourceState)
import Strive.Internal.TH (options)
import Strive.Types.Athletes (AthleteSummary)
data =
{ :: Integer,
:: AthleteSummary,
:: UTCTime,
:: Integer,
:: ResourceState,
:: Text
}
deriving (Int -> CommentSummary -> ShowS
[CommentSummary] -> ShowS
CommentSummary -> String
(Int -> CommentSummary -> ShowS)
-> (CommentSummary -> String)
-> ([CommentSummary] -> ShowS)
-> Show CommentSummary
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
$cshowsPrec :: Int -> CommentSummary -> ShowS
showsPrec :: Int -> CommentSummary -> ShowS
$cshow :: CommentSummary -> String
show :: CommentSummary -> String
$cshowList :: [CommentSummary] -> ShowS
showList :: [CommentSummary] -> ShowS
Show)
$(deriveFromJSON options ''CommentSummary)