clckwrks-0.26.3: A secure, reliable content management system (CMS) and blogging platform
Safe HaskellNone
LanguageHaskell2010

Clckwrks.Authenticate.API

Synopsis

Documentation

newtype Username #

an arbitrary, but unique string that the user uses to identify themselves

Constructors

Username 

Fields

Instances

Instances details
Eq Username 
Instance details

Defined in Happstack.Authenticate.Core

Data Username 
Instance details

Defined in Happstack.Authenticate.Core

Methods

gfoldl :: (forall d b. Data d => c (d -> b) -> d -> c b) -> (forall g. g -> c g) -> Username -> c Username #

gunfold :: (forall b r. Data b => c (b -> r) -> c r) -> (forall r. r -> c r) -> Constr -> c Username #

toConstr :: Username -> Constr #

dataTypeOf :: Username -> DataType #

dataCast1 :: Typeable t => (forall d. Data d => c (t d)) -> Maybe (c Username) #

dataCast2 :: Typeable t => (forall d e. (Data d, Data e) => c (t d e)) -> Maybe (c Username) #

gmapT :: (forall b. Data b => b -> b) -> Username -> Username #

gmapQl :: (r -> r' -> r) -> r -> (forall d. Data d => d -> r') -> Username -> r #

gmapQr :: forall r r'. (r' -> r -> r) -> r -> (forall d. Data d => d -> r') -> Username -> r #

gmapQ :: (forall d. Data d => d -> u) -> Username -> [u] #

gmapQi :: Int -> (forall d. Data d => d -> u) -> Username -> u #

gmapM :: Monad m => (forall d. Data d => d -> m d) -> Username -> m Username #

gmapMp :: MonadPlus m => (forall d. Data d => d -> m d) -> Username -> m Username #

gmapMo :: MonadPlus m => (forall d. Data d => d -> m d) -> Username -> m Username #

Ord Username 
Instance details

Defined in Happstack.Authenticate.Core

Read Username 
Instance details

Defined in Happstack.Authenticate.Core

Show Username 
Instance details

Defined in Happstack.Authenticate.Core

Generic Username 
Instance details

Defined in Happstack.Authenticate.Core

Associated Types

type Rep Username :: Type -> Type #

Methods

from :: Username -> Rep Username x #

to :: Rep Username x -> Username #

SafeCopy Username 
Instance details

Defined in Happstack.Authenticate.Core

ToJSON Username 
Instance details

Defined in Happstack.Authenticate.Core

FromJSON Username 
Instance details

Defined in Happstack.Authenticate.Core

PathInfo Username 
Instance details

Defined in Happstack.Authenticate.Core

Indexable UserIxs User 
Instance details

Defined in Happstack.Authenticate.Core

type Rep Username 
Instance details

Defined in Happstack.Authenticate.Core

type Rep Username = D1 ('MetaData "Username" "Happstack.Authenticate.Core" "happstack-authenticate-2.4.1-AoCOjdUbYNxCV6fqpZglew" 'True) (C1 ('MetaCons "Username" 'PrefixI 'True) (S1 ('MetaSel ('Just "_unUsername") 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Text)))

insecureUpdateUser :: User -> Clck url () Source #

Update an existing User. Must already have a valid UserId.

no security checks are performed to ensure that the caller is authorized to change data for the User.