{-# LANGUAGE CPP #-}
{-# LANGUAGE NoImplicitPrelude #-}
module Network.TLS.Imports
    (
    
      ByteString
    , (<&>)
    , module Control.Applicative
    , module Control.Monad
#if !MIN_VERSION_base(4,13,0)
    , MonadFail
#endif
    , module Data.Bits
    , module Data.List
    , module Data.Maybe
    , module Data.Semigroup
    , module Data.Ord
    , module Data.Word
    
    , showBytesHex
    ) where
import Data.ByteString (ByteString)
import Data.ByteString.Char8 () 
#if MIN_VERSION_base(4,11,0)
import Data.Functor
#endif
import Control.Applicative
import Control.Monad
#if !MIN_VERSION_base(4,13,0)
import Control.Monad.Fail (MonadFail)
#endif
import Data.Bits
import Data.List
import Data.Maybe hiding (fromJust)
import Data.Semigroup
import Data.Ord
import Data.Word
import Data.ByteArray.Encoding as B
import qualified Prelude as P
#if !MIN_VERSION_base(4,11,0)
(<&>) :: Functor f => f a -> (a -> b) -> f b
(<&>) = P.flip fmap
infixl 1 <&>
#endif
showBytesHex :: ByteString -> P.String
showBytesHex :: ByteString -> String
showBytesHex ByteString
bs = ByteString -> String
forall a. Show a => a -> String
P.show (Base -> ByteString -> ByteString
forall bin bout.
(ByteArrayAccess bin, ByteArray bout) =>
Base -> bin -> bout
B.convertToBase Base
B.Base16 ByteString
bs :: ByteString)