{-# OPTIONS_GHC -Wno-orphans #-}
module GHC.Debugger.View.Text where

import GHC.Debugger.View.Class

import qualified Data.Text          as T

instance DebugView T.Text where
  debugValue :: Text -> VarValue
debugValue  Text
t = String -> Bool -> VarValue
simpleValue (String -> String
forall a. Show a => a -> String
show (Text -> String
T.unpack Text
t)) Bool
False
  debugFields :: Text -> Program VarFields
debugFields Text
_ = VarFields -> Program VarFields
forall a. a -> Program a
forall (f :: * -> *) a. Applicative f => a -> f a
pure (VarFields -> Program VarFields) -> VarFields -> Program VarFields
forall a b. (a -> b) -> a -> b
$ [(String, VarFieldValue)] -> VarFields
VarFields []