{-# LANGUAGE DeriveLift #-}

module Burrito.Type.Literal
  ( Literal(..)
  ) where

import qualified Burrito.Type.Character as Character
import qualified Burrito.Type.NonEmpty as NonEmpty
import qualified Language.Haskell.TH.Syntax as TH


-- | Represents a literal in a token.
newtype Literal = Literal
  { characters :: NonEmpty.NonEmpty Character.Character
  } deriving (Eq, TH.Lift, Show)