yesod-session-persist-0.0.0.2: SQL session backend for Yesod
Safe HaskellSafe-Inferred
LanguageGHC2021

Session.Timing.Timeout

Synopsis

Documentation

data Timeout a Source #

How long sessions are allowed to live

See defaultTimeout.

Constructors

Timeout 

Fields

  • idle :: Maybe a

    The amount of time a session will remain active in case there is no activity in the session

    This is used both on the client side (by setting the cookie expires fields) and on the server.

    Setting to Nothing removes the idle timeout.

  • absolute :: Maybe a

    The maximum amount of time a session can be active

    This is used both on the client side (by setting the cookie expires fields) and on the server side.

    Setting to Nothing removes the absolute timeout.

Instances

Instances details
Functor Timeout Source # 
Instance details

Defined in Session.Timing.Timeout

Methods

fmap :: (a -> b) -> Timeout a -> Timeout b #

(<$) :: a -> Timeout b -> Timeout a #

Arbitrary a => Arbitrary (Timeout a) Source # 
Instance details

Defined in Session.Timing.Timeout

Methods

arbitrary :: Gen (Timeout a) #

shrink :: Timeout a -> [Timeout a] #

Generic (Timeout a) Source # 
Instance details

Defined in Session.Timing.Timeout

Associated Types

type Rep (Timeout a) :: Type -> Type #

Methods

from :: Timeout a -> Rep (Timeout a) x #

to :: Rep (Timeout a) x -> Timeout a #

Show a => Show (Timeout a) Source # 
Instance details

Defined in Session.Timing.Timeout

Methods

showsPrec :: Int -> Timeout a -> ShowS #

show :: Timeout a -> String #

showList :: [Timeout a] -> ShowS #

Eq a => Eq (Timeout a) Source # 
Instance details

Defined in Session.Timing.Timeout

Methods

(==) :: Timeout a -> Timeout a -> Bool #

(/=) :: Timeout a -> Timeout a -> Bool #

type Rep (Timeout a) Source # 
Instance details

Defined in Session.Timing.Timeout

type Rep (Timeout a) = D1 ('MetaData "Timeout" "Session.Timing.Timeout" "yesod-session-persist-0.0.0.2-4wroKzVSNpLxsAaD7x2SU-internal" 'False) (C1 ('MetaCons "Timeout" 'PrefixI 'True) (S1 ('MetaSel ('Just "idle") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a)) :*: S1 ('MetaSel ('Just "absolute") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Maybe a))))

defaultTimeout :: Timeout NominalDiffTime Source #

Default timeouts

  • idle = 8 hours
  • absolute = 30 days