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