{-|
Module: BattlePlace.Rating
Description: Rating type.
License: MIT
-}

{-# LANGUAGE GeneralizedNewtypeDeriving #-}

module BattlePlace.Rating
        ( Rating(..)
        ) where

import qualified Data.Aeson as J

-- | User rating.
newtype Rating = Rating Double deriving (Eq, Ord, J.FromJSON, J.ToJSON)