{-# LANGUAGE DeriveGeneric #-}
module Battlesnake.API.InfoResponse where
import Data.Aeson (ToJSON)
import Data.Text
import GHC.Generics
data InfoResponse = InfoResponse
{ InfoResponse -> Text
apiversion :: Text,
InfoResponse -> Maybe Text
author :: Maybe Text,
InfoResponse -> Maybe Text
color :: Maybe Text,
InfoResponse -> Maybe Text
head :: Maybe Text,
InfoResponse -> Maybe Text
tail :: Maybe Text,
InfoResponse -> Maybe Text
version :: Maybe Text
}
deriving (Int -> InfoResponse -> ShowS
[InfoResponse] -> ShowS
InfoResponse -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [InfoResponse] -> ShowS
$cshowList :: [InfoResponse] -> ShowS
show :: InfoResponse -> String
$cshow :: InfoResponse -> String
showsPrec :: Int -> InfoResponse -> ShowS
$cshowsPrec :: Int -> InfoResponse -> ShowS
Show, forall x. Rep InfoResponse x -> InfoResponse
forall x. InfoResponse -> Rep InfoResponse x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep InfoResponse x -> InfoResponse
$cfrom :: forall x. InfoResponse -> Rep InfoResponse x
Generic)
instance ToJSON InfoResponse