{-# LANGUAGE OverloadedStrings #-}
{-# OPTIONS_GHC -fno-warn-orphans #-}
module TextShow.Control.Monad.ST () where
import Control.Monad.ST (ST)
import TextShow.Classes (TextShow(..), TextShow1(..), TextShow2(..))
instance TextShow (ST s a) where
    showb = liftShowbPrec undefined undefined 0
    {-# INLINE showb #-}
instance TextShow1 (ST s) where
    liftShowbPrec = liftShowbPrec2 undefined undefined
    {-# INLINE liftShowbPrec #-}
instance TextShow2 ST where
    liftShowbPrec2 _ _ _ _ _ _ = "<<ST action>>"
    {-# INLINE liftShowbPrec2 #-}