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