{-# LANGUAGE DeriveAnyClass #-} {-# LANGUAGE DeriveGeneric #-} module Web.OpenWeatherMap.Types.Sys ( Sys(..) ) where import GHC.Generics (Generic) import Data.Aeson (FromJSON) data Sys = Sys { Sys -> Maybe String country :: Maybe String , Sys -> Int sunrise :: Int , Sys -> Int sunset :: Int } deriving (Int -> Sys -> ShowS [Sys] -> ShowS Sys -> String forall a. (Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a showList :: [Sys] -> ShowS $cshowList :: [Sys] -> ShowS show :: Sys -> String $cshow :: Sys -> String showsPrec :: Int -> Sys -> ShowS $cshowsPrec :: Int -> Sys -> ShowS Show, forall x. Rep Sys x -> Sys forall x. Sys -> Rep Sys x forall a. (forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a $cto :: forall x. Rep Sys x -> Sys $cfrom :: forall x. Sys -> Rep Sys x Generic, Value -> Parser [Sys] Value -> Parser Sys forall a. (Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a parseJSONList :: Value -> Parser [Sys] $cparseJSONList :: Value -> Parser [Sys] parseJSON :: Value -> Parser Sys $cparseJSON :: Value -> Parser Sys FromJSON)