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

import GHC.Debugger.View.Class

import qualified Data.ByteString    as BS

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