module Test.WebDriver.Session.History where

import Data.ByteString.Lazy (ByteString)
import Network.HTTP.Client (Request, Response)
import Control.Exception (SomeException)


data SessionHistory = SessionHistory 
    { SessionHistory -> Request
histRequest :: Request
    , SessionHistory -> Either SomeException (Response ByteString)
histResponse :: Either SomeException (Response ByteString)
    , SessionHistory -> Int
histRetryCount :: Int
    }
    deriving (Int -> SessionHistory -> ShowS
[SessionHistory] -> ShowS
SessionHistory -> String
forall a.
(Int -> a -> ShowS) -> (a -> String) -> ([a] -> ShowS) -> Show a
showList :: [SessionHistory] -> ShowS
$cshowList :: [SessionHistory] -> ShowS
show :: SessionHistory -> String
$cshow :: SessionHistory -> String
showsPrec :: Int -> SessionHistory -> ShowS
$cshowsPrec :: Int -> SessionHistory -> ShowS
Show)