yesod-sqlite-demo-0.1.0.0
Safe HaskellSafe-Inferred
LanguageHaskell2010

Foundation

Documentation

data Variable Source #

Instances

Instances details
FromJSON Variable Source # 
Instance details

Defined in Foundation

Methods

parseJSON :: Value -> Parser Variable

parseJSONList :: Value -> Parser [Variable]

ToJSON Variable Source # 
Instance details

Defined in Foundation

Methods

toJSON :: Variable -> Value

toEncoding :: Variable -> Encoding

toJSONList :: [Variable] -> Value

toEncodingList :: [Variable] -> Encoding

PersistEntity Variable Source # 
Instance details

Defined in Foundation

Associated Types

type PersistEntityBackend Variable

data Key Variable

data EntityField Variable :: Type -> Type

data Unique Variable

Methods

keyToValues :: Key Variable -> [PersistValue]

keyFromValues :: [PersistValue] -> Either Text (Key Variable)

persistIdField :: EntityField Variable (Key Variable)

entityDef :: proxy Variable -> EntityDef

persistFieldDef :: EntityField Variable typ -> FieldDef

toPersistFields :: Variable -> [SomePersistField]

fromPersistValues :: [PersistValue] -> Either Text Variable

persistUniqueKeys :: Variable -> [Unique Variable]

persistUniqueToFieldNames :: Unique Variable -> NonEmpty (FieldNameHS, FieldNameDB)

persistUniqueToValues :: Unique Variable -> [PersistValue]

fieldLens :: EntityField Variable field -> forall (f :: Type -> Type). Functor f => (field -> f field) -> Entity Variable -> f (Entity Variable)

keyFromRecordM :: Maybe (Variable -> Key Variable)

PersistField Variable Source # 
Instance details

Defined in Foundation

Methods

toPersistValue :: Variable -> PersistValue

fromPersistValue :: PersistValue -> Either Text Variable

AtLeastOneUniqueKey Variable Source # 
Instance details

Defined in Foundation

OnlyOneUniqueKey Variable Source # 
Instance details

Defined in Foundation

Methods

onlyUniqueP :: Variable -> Unique Variable

PersistFieldSql Variable Source # 
Instance details

Defined in Foundation

Methods

sqlType :: Proxy Variable -> SqlType

ToBackendKey SqlBackend Variable Source # 
Instance details

Defined in Foundation

Methods

toBackendKey :: Key Variable -> BackendKey SqlBackend

fromBackendKey :: BackendKey SqlBackend -> Key Variable

SymbolToField "created" Variable UTCTime Source # 
Instance details

Defined in Foundation

Methods

symbolToField :: EntityField Variable UTCTime

SymbolToField "name" Variable Text Source # 
Instance details

Defined in Foundation

Methods

symbolToField :: EntityField Variable Text

SymbolToField "updated" Variable UTCTime Source # 
Instance details

Defined in Foundation

Methods

symbolToField :: EntityField Variable UTCTime

SymbolToField "value" Variable Double Source # 
Instance details

Defined in Foundation

Methods

symbolToField :: EntityField Variable Double

SymbolToField "id" Variable (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

symbolToField :: EntityField Variable (Key Variable)

FromJSON (Entity Variable) Source # 
Instance details

Defined in Foundation

Methods

parseJSON :: Value -> Parser (Entity Variable)

parseJSONList :: Value -> Parser [Entity Variable]

FromJSON (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

parseJSON :: Value -> Parser (Key Variable)

parseJSONList :: Value -> Parser [Key Variable]

ToJSON (Entity Variable) Source # 
Instance details

Defined in Foundation

Methods

toJSON :: Entity Variable -> Value

toEncoding :: Entity Variable -> Encoding

toJSONList :: [Entity Variable] -> Value

toEncodingList :: [Entity Variable] -> Encoding

ToJSON (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

toJSON :: Key Variable -> Value

toEncoding :: Key Variable -> Encoding

toJSONList :: [Key Variable] -> Value

toEncodingList :: [Key Variable] -> Encoding

Read (Key Variable) Source # 
Instance details

Defined in Foundation

Show (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

showsPrec :: Int -> Key Variable -> ShowS #

show :: Key Variable -> String #

showList :: [Key Variable] -> ShowS #

Eq (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

(==) :: Key Variable -> Key Variable -> Bool #

(/=) :: Key Variable -> Key Variable -> Bool #

Ord (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

compare :: Key Variable -> Key Variable -> Ordering #

(<) :: Key Variable -> Key Variable -> Bool #

(<=) :: Key Variable -> Key Variable -> Bool #

(>) :: Key Variable -> Key Variable -> Bool #

(>=) :: Key Variable -> Key Variable -> Bool #

max :: Key Variable -> Key Variable -> Key Variable #

min :: Key Variable -> Key Variable -> Key Variable #

FromHttpApiData (Key Variable) Source # 
Instance details

Defined in Foundation

ToHttpApiData (Key Variable) Source # 
Instance details

Defined in Foundation

PathPiece (Key Variable) Source # 
Instance details

Defined in Foundation

PersistField (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

toPersistValue :: Key Variable -> PersistValue

fromPersistValue :: PersistValue -> Either Text (Key Variable)

PersistFieldSql (Key Variable) Source # 
Instance details

Defined in Foundation

Methods

sqlType :: Proxy (Key Variable) -> SqlType

data EntityField Variable typ Source # 
Instance details

Defined in Foundation

data EntityField Variable typ
newtype Key Variable Source # 
Instance details

Defined in Foundation

newtype Key Variable = VariableKey {}
type PersistEntityBackend Variable Source # 
Instance details

Defined in Foundation

type PersistEntityBackend Variable = SqlBackend
data Unique Variable Source # 
Instance details

Defined in Foundation

data Unique Variable = UniqueName Text

migrateAll :: Migration Source #

data App Source #

Constructors

App 

Fields

Instances

Instances details
YesodDispatch App 
Instance details

Defined in Application

Methods

yesodDispatch :: YesodRunnerEnv App -> 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

Read (Route App) Source # 
Instance details

Defined in Foundation

Methods

readsPrec :: Int -> ReadS (Route App) #

readList :: ReadS [Route App] #

readPrec :: ReadPrec (Route App) #

readListPrec :: ReadPrec [Route App] #

Show (Route App) Source # 
Instance details

Defined in Foundation

Methods

showsPrec :: Int -> Route App -> ShowS #

show :: Route App -> String #

showList :: [Route App] -> ShowS #

Eq (Route App) Source # 
Instance details

Defined in Foundation

Methods

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

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

data Route App Source # 
Instance details

Defined in Foundation

data Route App
type YesodPersistBackend App Source # 
Instance details

Defined in Foundation

type YesodPersistBackend App = SqlBackend

type Handler = HandlerFor App Source #

type Widget = WidgetFor App () Source #

resourcesApp :: [ResourceTree String] Source #