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

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

import GHC.Generics (Generic)

import Data.Aeson (FromJSON)

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