module Servant.Client.Core.Internal where

import           Control.DeepSeq
                 (rnf)
import           Network.HTTP.Media
                 (MediaType, mainType, parameters, subType)

mediaTypeRnf :: MediaType -> ()
mediaTypeRnf :: MediaType -> ()
mediaTypeRnf MediaType
mt =
    CI ByteString -> ()
forall a. NFData a => a -> ()
rnf (MediaType -> CI ByteString
mainType MediaType
mt) () -> () -> ()
`seq`
    CI ByteString -> ()
forall a. NFData a => a -> ()
rnf (MediaType -> CI ByteString
subType MediaType
mt) () -> () -> ()
`seq`
    Parameters -> ()
forall a. NFData a => a -> ()
rnf (MediaType -> Parameters
parameters MediaType
mt)