espial-0.0.20: Espial is an open-source, web-based bookmarking server.
Safe HaskellSafe-Inferred
LanguageHaskell2010

Foundation

Documentation

data App Source #

Constructors

App 

Fields

Instances

Instances details
HasHttpManager App Source # 
Instance details

Defined in Foundation

YesodAuth App Source # 
Instance details

Defined in Foundation

Associated Types

type AuthId App #

YesodAuthPersist App Source # 
Instance details

Defined in Foundation

Associated Types

type AuthEntity App #

YesodDispatch App Source # 
Instance details

Defined in Application

Yesod App Source # 
Instance details

Defined in Foundation

Methods

approot :: Approot App #

catchHandlerExceptions :: MonadUnliftIO m => App -> m a -> (SomeException -> m a) -> m a #

errorHandler :: ErrorResponse -> HandlerFor App TypedContent #

defaultLayout :: WidgetFor App () -> HandlerFor App Html #

urlParamRenderOverride :: App -> Route App -> [(Text, Text)] -> Maybe Builder #

isAuthorized :: Route App -> Bool -> HandlerFor App AuthResult #

isWriteRequest :: Route App -> HandlerFor App Bool #

authRoute :: App -> Maybe (Route App) #

cleanPath :: App -> [Text] -> Either [Text] [Text] #

joinPath :: App -> Text -> [Text] -> [(Text, Text)] -> Builder #

addStaticContent :: Text -> Text -> ByteString -> HandlerFor App (Maybe (Either Text (Route App, [(Text, Text)]))) #

maximumContentLength :: App -> Maybe (Route App) -> Maybe Word64 #

maximumContentLengthIO :: App -> Maybe (Route App) -> IO (Maybe Word64) #

makeLogger :: App -> IO Logger #

messageLoggerSource :: App -> Logger -> Loc -> LogSource -> LogLevel -> LogStr -> IO () #

jsLoader :: App -> ScriptLoadPosition App #

jsAttributes :: App -> [(Text, Text)] #

jsAttributesHandler :: HandlerFor App [(Text, Text)] #

makeSessionBackend :: App -> IO (Maybe SessionBackend) #

fileUpload :: App -> RequestBodyLength -> FileUpload #

shouldLogIO :: App -> LogSource -> LogLevel -> IO Bool #

yesodMiddleware :: ToTypedContent res => HandlerFor App res -> HandlerFor App res #

yesodWithInternalState :: App -> Maybe (Route App) -> (InternalState -> IO a) -> IO a #

defaultMessageWidget :: Html -> HtmlUrl (Route App) -> WidgetFor App () #

ParseRoute App Source # 
Instance details

Defined in Foundation

Methods

parseRoute :: ([Text], [(Text, Text)]) -> Maybe (Route App) #

RenderRoute App Source # 
Instance details

Defined in Foundation

Associated Types

data Route App #

Methods

renderRoute :: Route App -> ([Text], [(Text, Text)]) #

RouteAttrs App Source # 
Instance details

Defined in Foundation

Methods

routeAttrs :: Route App -> Set Text #

YesodPersist App Source # 
Instance details

Defined in Foundation

Associated Types

type YesodPersistBackend App #

Methods

runDB :: YesodDB App a -> HandlerFor App a #

YesodPersistRunner App Source # 
Instance details

Defined in Foundation

RenderMessage App FormMessage Source # 
Instance details

Defined in Foundation

Methods

renderMessage :: App -> [Lang] -> FormMessage -> Text #

Generic (Route App) Source # 
Instance details

Defined in Foundation

Associated Types

type Rep (Route App) :: Type -> Type #

Methods

from :: Route App -> Rep (Route App) x #

to :: Rep (Route App) x -> Route App #

Read (Route App) Source # 
Instance details

Defined in Foundation

Show (Route App) Source # 
Instance details

Defined in Foundation

Eq (Route App) Source # 
Instance details

Defined in Foundation

Methods

(==) :: Route App -> Route App -> Bool #

(/=) :: Route App -> Route App -> Bool #

type AuthEntity App Source # 
Instance details

Defined in Foundation

type AuthEntity App = KeyEntity (AuthId App)
type AuthId App Source # 
Instance details

Defined in Foundation

data Route App Source # 
Instance details

Defined in Foundation

type YesodPersistBackend App Source # 
Instance details

Defined in Foundation

type Rep (Route App) Source # 
Instance details

Defined in Foundation

type Rep (Route App) = D1 ('MetaData "Route" "Foundation" "espial-0.0.20-EcVaTGJvbgfEg2qawed6qP" 'False) (((((C1 ('MetaCons "StaticR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Route Static))) :+: C1 ('MetaCons "FaviconR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "RobotsR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AuthR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 (Route Auth))))) :+: ((C1 ('MetaCons "NotesR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP)) :+: C1 ('MetaCons "AddNoteViewR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP))) :+: (C1 ('MetaCons "AddNoteSlimViewR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "NotesFeedR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP))))) :+: (((C1 ('MetaCons "NoteR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 NtSlug)) :+: C1 ('MetaCons "AddNoteR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "DeleteNoteR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: C1 ('MetaCons "HomeR" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "UserR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP)) :+: C1 ('MetaCons "UserSharedR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SharedP))) :+: (C1 ('MetaCons "UserFilterR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilterP)) :+: C1 ('MetaCons "UserTagsR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TagsP)))))) :+: ((((C1 ('MetaCons "UserFeedR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP)) :+: C1 ('MetaCons "UserFeedSharedR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 SharedP))) :+: (C1 ('MetaCons "UserFeedFilterR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 FilterP)) :+: C1 ('MetaCons "UserFeedTagsR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 UserNameP) :*: S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 TagsP)))) :+: ((C1 ('MetaCons "AccountSettingsR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "EditAccountSettingsR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "ChangePasswordR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "AddViewR" 'PrefixI 'False) (U1 :: Type -> Type)))) :+: (((C1 ('MetaCons "AddR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "LookupTitleR" 'PrefixI 'False) (U1 :: Type -> Type)) :+: (C1 ('MetaCons "UserTagCloudR" 'PrefixI 'False) (U1 :: Type -> Type) :+: C1 ('MetaCons "UserTagCloudModeR" 'PrefixI 'False) (U1 :: Type -> Type))) :+: ((C1 ('MetaCons "DeleteR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: C1 ('MetaCons "ReadR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64))) :+: (C1 ('MetaCons "StarR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: (C1 ('MetaCons "UnstarR" 'PrefixI 'False) (S1 ('MetaSel ('Nothing :: Maybe Symbol) 'NoSourceUnpackedness 'NoSourceStrictness 'DecidedLazy) (Rec0 Int64)) :+: C1 ('MetaCons "DocsSearchR" 'PrefixI 'False) (U1 :: Type -> Type)))))))