{-# LANGUAGE PatternSynonyms #-}
{-# LANGUAGE ImplicitParams, ConstraintKinds, KindSignatures #-}
{-# OPTIONS_GHC -fno-warn-unused-imports #-}
module JSDOM.Generated.PerformanceTiming
       (getNavigationStart, getUnloadEventStart, getUnloadEventEnd,
        getRedirectStart, getRedirectEnd, getFetchStart,
        getDomainLookupStart, getDomainLookupEnd, getConnectStart,
        getConnectEnd, getSecureConnectionStart, getRequestStart,
        getResponseStart, getResponseEnd, getDomLoading, getDomInteractive,
        getDomContentLoadedEventStart, getDomContentLoadedEventEnd,
        getDomComplete, getLoadEventStart, getLoadEventEnd,
        PerformanceTiming(..), gTypePerformanceTiming)
       where
import Prelude ((.), (==), (>>=), return, IO, Int, Float, Double, Bool(..), Maybe, maybe, fromIntegral, round, realToFrac, fmap, Show, Read, Eq, Ord, Maybe(..))
import qualified Prelude (error)
import Data.Typeable (Typeable)
import Data.Traversable (mapM)
import Language.Javascript.JSaddle (JSM(..), JSVal(..), JSString, strictEqual, toJSVal, valToStr, valToNumber, valToBool, js, jss, jsf, jsg, function, asyncFunction, new, array, jsUndefined, (!), (!!))
import Data.Int (Int64)
import Data.Word (Word, Word64)
import JSDOM.Types
import Control.Applicative ((<$>))
import Control.Monad (void)
import Control.Lens.Operators ((^.))
import JSDOM.EventTargetClosures (EventName, unsafeEventName, unsafeEventNameAsync)
import JSDOM.Enums
getNavigationStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getNavigationStart self
  = liftDOM
      (round <$> ((self ^. js "navigationStart") >>= valToNumber))
getUnloadEventStart ::
                    (MonadDOM m) => PerformanceTiming -> m Word64
getUnloadEventStart self
  = liftDOM
      (round <$> ((self ^. js "unloadEventStart") >>= valToNumber))
getUnloadEventEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getUnloadEventEnd self
  = liftDOM
      (round <$> ((self ^. js "unloadEventEnd") >>= valToNumber))
getRedirectStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getRedirectStart self
  = liftDOM
      (round <$> ((self ^. js "redirectStart") >>= valToNumber))
getRedirectEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getRedirectEnd self
  = liftDOM (round <$> ((self ^. js "redirectEnd") >>= valToNumber))
getFetchStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getFetchStart self
  = liftDOM (round <$> ((self ^. js "fetchStart") >>= valToNumber))
getDomainLookupStart ::
                     (MonadDOM m) => PerformanceTiming -> m Word64
getDomainLookupStart self
  = liftDOM
      (round <$> ((self ^. js "domainLookupStart") >>= valToNumber))
getDomainLookupEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getDomainLookupEnd self
  = liftDOM
      (round <$> ((self ^. js "domainLookupEnd") >>= valToNumber))
getConnectStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getConnectStart self
  = liftDOM (round <$> ((self ^. js "connectStart") >>= valToNumber))
getConnectEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getConnectEnd self
  = liftDOM (round <$> ((self ^. js "connectEnd") >>= valToNumber))
getSecureConnectionStart ::
                         (MonadDOM m) => PerformanceTiming -> m Word64
getSecureConnectionStart self
  = liftDOM
      (round <$> ((self ^. js "secureConnectionStart") >>= valToNumber))
getRequestStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getRequestStart self
  = liftDOM (round <$> ((self ^. js "requestStart") >>= valToNumber))
getResponseStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getResponseStart self
  = liftDOM
      (round <$> ((self ^. js "responseStart") >>= valToNumber))
getResponseEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getResponseEnd self
  = liftDOM (round <$> ((self ^. js "responseEnd") >>= valToNumber))
getDomLoading :: (MonadDOM m) => PerformanceTiming -> m Word64
getDomLoading self
  = liftDOM (round <$> ((self ^. js "domLoading") >>= valToNumber))
getDomInteractive :: (MonadDOM m) => PerformanceTiming -> m Word64
getDomInteractive self
  = liftDOM
      (round <$> ((self ^. js "domInteractive") >>= valToNumber))
getDomContentLoadedEventStart ::
                              (MonadDOM m) => PerformanceTiming -> m Word64
getDomContentLoadedEventStart self
  = liftDOM
      (round <$>
         ((self ^. js "domContentLoadedEventStart") >>= valToNumber))
getDomContentLoadedEventEnd ::
                            (MonadDOM m) => PerformanceTiming -> m Word64
getDomContentLoadedEventEnd self
  = liftDOM
      (round <$>
         ((self ^. js "domContentLoadedEventEnd") >>= valToNumber))
getDomComplete :: (MonadDOM m) => PerformanceTiming -> m Word64
getDomComplete self
  = liftDOM (round <$> ((self ^. js "domComplete") >>= valToNumber))
getLoadEventStart :: (MonadDOM m) => PerformanceTiming -> m Word64
getLoadEventStart self
  = liftDOM
      (round <$> ((self ^. js "loadEventStart") >>= valToNumber))
getLoadEventEnd :: (MonadDOM m) => PerformanceTiming -> m Word64
getLoadEventEnd self
  = liftDOM (round <$> ((self ^. js "loadEventEnd") >>= valToNumber))