module Test.WebDriver.Utils where

import Data.Text (Text)
import Data.Text.Encoding as TE
import qualified Network.HTTP.Types.URI as HTTP

urlEncode :: Text -> Text
urlEncode :: Text -> Text
urlEncode = ByteString -> Text
TE.decodeUtf8 (ByteString -> Text) -> (Text -> ByteString) -> Text -> Text
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Bool -> ByteString -> ByteString
HTTP.urlEncode Bool
False (ByteString -> ByteString)
-> (Text -> ByteString) -> Text -> ByteString
forall b c a. (b -> c) -> (a -> b) -> a -> c
. Text -> ByteString
TE.encodeUtf8