cookie-tray-0.0.0.0: For serving cookies
Safe HaskellSafe-Inferred
LanguageGHC2021

CookieTray

Synopsis

Command

class ToCommandList a where Source #

Methods

toCommandList :: a -> [Command] Source #

Instances

Instances details
ToCommandList Command Source # 
Instance details

Defined in CookieTray.Command

ToCommandList Many Source # 
Instance details

Defined in CookieTray.Command.Many

ToCommandList PutMany Source # 
Instance details

Defined in CookieTray.Command.PutMany

ToCommandList PutOne Source # 
Instance details

Defined in CookieTray.Command.PutOne

data Command Source #

Instances

Instances details
Show Command Source # 
Instance details

Defined in CookieTray.Command

ToCommandList Command Source # 
Instance details

Defined in CookieTray.Command

Eq Command Source # 
Instance details

Defined in CookieTray.Command

Methods

(==) :: Command -> Command -> Bool #

(/=) :: Command -> Command -> Bool #

Ord Command Source # 
Instance details

Defined in CookieTray.Command

data Action a Source #

Constructors

Delete 
Put a 

Instances

Instances details
Functor Action Source # 
Instance details

Defined in CookieTray.Types

Methods

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

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

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

Defined in CookieTray.Types

Methods

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

show :: Action a -> String #

showList :: [Action a] -> ShowS #

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

Defined in CookieTray.Types

Methods

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

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

Ord a => Ord (Action a) Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Action a -> Action a -> Ordering #

(<) :: Action a -> Action a -> Bool #

(<=) :: Action a -> Action a -> Bool #

(>) :: Action a -> Action a -> Bool #

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

max :: Action a -> Action a -> Action a #

min :: Action a -> Action a -> Action a #

Tray

newtype Tray a Source #

Constructors

Tray (Map Name a) 

Instances

Instances details
Functor Tray Source # 
Instance details

Defined in CookieTray

Methods

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

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

Monoid (Tray a) Source # 
Instance details

Defined in CookieTray

Methods

mempty :: Tray a #

mappend :: Tray a -> Tray a -> Tray a #

mconcat :: [Tray a] -> Tray a #

Semigroup (Tray a) Source #

Left-biased map union

Instance details

Defined in CookieTray

Methods

(<>) :: Tray a -> Tray a -> Tray a #

sconcat :: NonEmpty (Tray a) -> Tray a #

stimes :: Integral b => b -> Tray a -> Tray a #

IsList (Tray a) Source # 
Instance details

Defined in CookieTray

Associated Types

type Item (Tray a) #

Methods

fromList :: [Item (Tray a)] -> Tray a #

fromListN :: Int -> [Item (Tray a)] -> Tray a #

toList :: Tray a -> [Item (Tray a)] #

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

Defined in CookieTray

Methods

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

show :: Tray a -> String #

showList :: [Tray a] -> ShowS #

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

Defined in CookieTray

Methods

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

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

Ord a => Ord (Tray a) Source # 
Instance details

Defined in CookieTray

Methods

compare :: Tray a -> Tray a -> Ordering #

(<) :: Tray a -> Tray a -> Bool #

(<=) :: Tray a -> Tray a -> Bool #

(>) :: Tray a -> Tray a -> Bool #

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

max :: Tray a -> Tray a -> Tray a #

min :: Tray a -> Tray a -> Tray a #

type Item (Tray a) Source # 
Instance details

Defined in CookieTray

type Item (Tray a) = Named a

lookup :: Name -> Tray a -> Maybe a Source #

fromList :: [Named a] -> Tray a Source #

toList :: Tray a -> [Named a] Source #

Name

newtype Name Source #

Constructors

Name 

Instances

Instances details
IsString Name Source # 
Instance details

Defined in CookieTray.Types

Methods

fromString :: String -> Name #

Show Name Source # 
Instance details

Defined in CookieTray.Types

Methods

showsPrec :: Int -> Name -> ShowS #

show :: Name -> String #

showList :: [Name] -> ShowS #

Eq Name Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Name -> Name -> Bool #

(/=) :: Name -> Name -> Bool #

Ord Name Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Name -> Name -> Ordering #

(<) :: Name -> Name -> Bool #

(<=) :: Name -> Name -> Bool #

(>) :: Name -> Name -> Bool #

(>=) :: Name -> Name -> Bool #

max :: Name -> Name -> Name #

min :: Name -> Name -> Name #

data Named a Source #

Constructors

Named 

Fields

Instances

Instances details
Show a => Show (Named a) Source # 
Instance details

Defined in CookieTray.Types

Methods

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

show :: Named a -> String #

showList :: [Named a] -> ShowS #

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

Defined in CookieTray.Types

Methods

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

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

Ord a => Ord (Named a) Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Named a -> Named a -> Ordering #

(<) :: Named a -> Named a -> Bool #

(<=) :: Named a -> Named a -> Bool #

(>) :: Named a -> Named a -> Bool #

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

max :: Named a -> Named a -> Named a #

min :: Named a -> Named a -> Named a #

Value

newtype Value Source #

Constructors

Value 

Instances

Instances details
IsString Value Source # 
Instance details

Defined in CookieTray.Types

Methods

fromString :: String -> Value #

Show Value Source # 
Instance details

Defined in CookieTray.Types

Methods

showsPrec :: Int -> Value -> ShowS #

show :: Value -> String #

showList :: [Value] -> ShowS #

Eq Value Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Value -> Value -> Bool #

(/=) :: Value -> Value -> Bool #

Ord Value Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Value -> Value -> Ordering #

(<) :: Value -> Value -> Bool #

(<=) :: Value -> Value -> Bool #

(>) :: Value -> Value -> Bool #

(>=) :: Value -> Value -> Bool #

max :: Value -> Value -> Value #

min :: Value -> Value -> Value #

Expiry

data Expiry Source #

Instances

Instances details
Show Expiry Source # 
Instance details

Defined in CookieTray.Types

Eq Expiry Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Expiry -> Expiry -> Bool #

(/=) :: Expiry -> Expiry -> Bool #

Ord Expiry Source # 
Instance details

Defined in CookieTray.Types

data Expiring a Source #

Constructors

Expiring 

Fields

Instances

Instances details
Functor Expiring Source # 
Instance details

Defined in CookieTray.Types

Methods

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

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

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

Defined in CookieTray.Types

Methods

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

show :: Expiring a -> String #

showList :: [Expiring a] -> ShowS #

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

Defined in CookieTray.Types

Methods

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

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

Ord a => Ord (Expiring a) Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Expiring a -> Expiring a -> Ordering #

(<) :: Expiring a -> Expiring a -> Bool #

(<=) :: Expiring a -> Expiring a -> Bool #

(>) :: Expiring a -> Expiring a -> Bool #

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

max :: Expiring a -> Expiring a -> Expiring a #

min :: Expiring a -> Expiring a -> Expiring a #

Meta

Security

data Security Source #

Constructors

Security 

Instances

Instances details
Show Security Source # 
Instance details

Defined in CookieTray.Types

Eq Security Source # 
Instance details

Defined in CookieTray.Types

Ord Security Source # 
Instance details

Defined in CookieTray.Types

data Secured a Source #

Constructors

Secured 

Fields

Instances

Instances details
Functor Secured Source # 
Instance details

Defined in CookieTray.Types

Methods

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

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

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

Defined in CookieTray.Types

Methods

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

show :: Secured a -> String #

showList :: [Secured a] -> ShowS #

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

Defined in CookieTray.Types

Methods

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

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

Ord a => Ord (Secured a) Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Secured a -> Secured a -> Ordering #

(<) :: Secured a -> Secured a -> Bool #

(<=) :: Secured a -> Secured a -> Bool #

(>) :: Secured a -> Secured a -> Bool #

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

max :: Secured a -> Secured a -> Secured a #

min :: Secured a -> Secured a -> Secured a #

data Origin Source #

Constructors

SameSite SameSiteOptions 
CrossSite

Instruct the client to send the cookie for all requests, even those originating from a third party. This option implies RequireEncryptedTransport.

Instances

Instances details
Show Origin Source # 
Instance details

Defined in CookieTray.Types

Eq Origin Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Origin -> Origin -> Bool #

(/=) :: Origin -> Origin -> Bool #

Ord Origin Source # 
Instance details

Defined in CookieTray.Types

data SameSiteStrictness Source #

Constructors

SameSiteStrict

Instruct the client not to send the cookie for requests originating from another site, e.g. if a user clicked a link from another site to yours. This setting offers the strongest protection against cross-site request forgery, but does not make sense in a lot of cases. (If somebody follows a link to your site, should they appear to be logged out?)

SameSiteLax

The client will send the cookie whenever your domain is what appears in the navigation bar

Scope

data Scope Source #

Constructors

Scope 

Fields

Instances

Instances details
Show Scope Source # 
Instance details

Defined in CookieTray.Types

Methods

showsPrec :: Int -> Scope -> ShowS #

show :: Scope -> String #

showList :: [Scope] -> ShowS #

Eq Scope Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Scope -> Scope -> Bool #

(/=) :: Scope -> Scope -> Bool #

Ord Scope Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Scope -> Scope -> Ordering #

(<) :: Scope -> Scope -> Bool #

(<=) :: Scope -> Scope -> Bool #

(>) :: Scope -> Scope -> Bool #

(>=) :: Scope -> Scope -> Bool #

max :: Scope -> Scope -> Scope #

min :: Scope -> Scope -> Scope #

data Domain Source #

The host to which the cookie will be sent

Instances

Instances details
Show Domain Source # 
Instance details

Defined in CookieTray.Types

Eq Domain Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Domain -> Domain -> Bool #

(/=) :: Domain -> Domain -> Bool #

Ord Domain Source # 
Instance details

Defined in CookieTray.Types

data Path Source #

Constructors

Path ByteString 
CurrentPath 

Instances

Instances details
Show Path Source # 
Instance details

Defined in CookieTray.Types

Methods

showsPrec :: Int -> Path -> ShowS #

show :: Path -> String #

showList :: [Path] -> ShowS #

Eq Path Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Path -> Path -> Bool #

(/=) :: Path -> Path -> Bool #

Ord Path Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Path -> Path -> Ordering #

(<) :: Path -> Path -> Bool #

(<=) :: Path -> Path -> Bool #

(>) :: Path -> Path -> Bool #

(>=) :: Path -> Path -> Bool #

max :: Path -> Path -> Path #

min :: Path -> Path -> Path #

data Meta Source #

Constructors

Meta 

Instances

Instances details
Show Meta Source # 
Instance details

Defined in CookieTray.Types

Methods

showsPrec :: Int -> Meta -> ShowS #

show :: Meta -> String #

showList :: [Meta] -> ShowS #

Eq Meta Source # 
Instance details

Defined in CookieTray.Types

Methods

(==) :: Meta -> Meta -> Bool #

(/=) :: Meta -> Meta -> Bool #

Ord Meta Source # 
Instance details

Defined in CookieTray.Types

Methods

compare :: Meta -> Meta -> Ordering #

(<) :: Meta -> Meta -> Bool #

(<=) :: Meta -> Meta -> Bool #

(>) :: Meta -> Meta -> Bool #

(>=) :: Meta -> Meta -> Bool #

max :: Meta -> Meta -> Meta #

min :: Meta -> Meta -> Meta #