{-# LANGUAGE DeriveAnyClass #-}
{-# LANGUAGE DeriveGeneric #-}

module Web.OpenWeatherMap.Types.Wind
  ( Wind(..)
  ) where

import GHC.Generics (Generic)

import Data.Aeson (FromJSON)

data Wind =
  Wind
    { Wind -> Double
speed :: Double
    , Wind -> Double
deg :: Double
    }
  deriving (Int -> Wind -> ShowS
[Wind] -> ShowS
Wind -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [Wind] -> ShowS
$cshowList :: [Wind] -> ShowS
show :: Wind -> String
$cshow :: Wind -> String
showsPrec :: Int -> Wind -> ShowS
$cshowsPrec :: Int -> Wind -> ShowS
Show, forall x. Rep Wind x -> Wind
forall x. Wind -> Rep Wind x
forall a.
(forall x. a -> Rep a x) -> (forall x. Rep a x -> a) -> Generic a
$cto :: forall x. Rep Wind x -> Wind
$cfrom :: forall x. Wind -> Rep Wind x
Generic, Value -> Parser [Wind]
Value -> Parser Wind
forall a.
(Value -> Parser a) -> (Value -> Parser [a]) -> FromJSON a
parseJSONList :: Value -> Parser [Wind]
$cparseJSONList :: Value -> Parser [Wind]
parseJSON :: Value -> Parser Wind
$cparseJSON :: Value -> Parser Wind
FromJSON)