{-# 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
VarValue (ByteString -> String
forall a. Show a => a -> String
show ByteString
t) Bool
False
  debugFields :: ByteString -> VarFields
debugFields ByteString
_ = [(String, VarFieldValue)] -> VarFields
VarFields []