{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -Wno-orphans #-}
module TextShow.Data.Dynamic () where
import Data.Dynamic (Dynamic, dynTypeRep)
import Prelude ()
import Prelude.Compat
import TextShow.Classes (TextShow(..))
import TextShow.Data.Typeable ()
instance TextShow Dynamic where
    showb :: Dynamic -> Builder
showb Dynamic
dyn = Builder
"<<" Builder -> Builder -> Builder
forall a. Semigroup a => a -> a -> a
<> SomeTypeRep -> Builder
forall a. TextShow a => a -> Builder
showb (Dynamic -> SomeTypeRep
dynTypeRep Dynamic
dyn) Builder -> Builder -> Builder
forall a. Semigroup a => a -> a -> a
<> Builder
">>"
    {-# INLINE showb #-}