{-# LANGUAGE GeneralizedNewtypeDeriving #-}
{-# LANGUAGE DeriveGeneric #-}
module Language.PureScript.Label (Label(..)) where
import Prelude.Compat hiding (lex)
import GHC.Generics (Generic)
import Control.DeepSeq (NFData)
import Data.Monoid ()
import Data.String (IsString(..))
import qualified Data.Aeson as A
import Language.PureScript.PSString (PSString)
newtype Label = Label { runLabel :: PSString }
deriving (Show, Eq, Ord, IsString, Semigroup, Monoid, A.ToJSON, A.FromJSON, Generic)
instance NFData Label