Module

InteractiveData

Package
purescript-interactive-data
Repository
thought2/purescript-interactive-data.all

Re-exports from DataMVC.Types

#DataUiInterface Source

newtype DataUiInterface :: (Type -> Type) -> Type -> Type -> Type -> Typenewtype DataUiInterface srf msg sta a

Constructors

Instances

#DataUICtx Source

newtype DataUICtx :: (Type -> Type) -> (Type -> Type) -> (Type -> Type) -> Typenewtype DataUICtx html fm fs

Constructors

#DataUI Source

newtype DataUI :: (Type -> Type) -> (Type -> Type) -> (Type -> Type) -> Type -> Type -> Type -> Typenewtype DataUI srf fm fs msg sta a

Constructors

Instances

Re-exports from DataMVC.Types.DataError

#scopeOpt Source

Re-exports from DataMVC.Types.DataUI

#refineDataUi Source

refineDataUi :: forall srf fm fs msg sta a b. RefineDataResults a b -> DataUI srf fm fs msg sta a -> DataUI srf fm fs msg sta b

Re-exports from InteractiveData.App

#WrapState Source

newtype WrapState sta

Instances

#WrapMsg Source

data WrapMsg msg

Instances

#AppState Source

newtype AppState sta

#AppMsg Source

type AppMsg msg = These (AppSelfMsg msg) IDOutMsg

Re-exports from InteractiveData.Class

#IDDataUI Source

class IDDataUI :: (Type -> Type) -> (Type -> Type) -> (Type -> Type) -> Type -> Type -> Type -> Constraintclass IDDataUI (html :: Type -> Type) (fm :: Type -> Type) (fs :: Type -> Type) (msg :: Type) (sta :: Type) (a :: Type) | a -> msg sta where

Members

Instances

Re-exports from InteractiveData.Class.Partial

#variantPartial_ Source

variantPartial_ :: forall html fm fs @initsym rcase rmsg rsta row datauisGiven. DefaultVariantPartial Tok datauisGiven html fm fs initsym rcase rmsg rsta row => Record datauisGiven -> DataUI (IDSurface html) fm fs (VariantMsg rcase rmsg) (VariantState rsta) (Variant row)

#recordPartial_ Source

recordPartial_ :: forall html fm fs rmsg rsta row datauisGiven. DefaultRecordPartial Tok (Record ()) datauisGiven html fm fs rmsg rsta row => Record datauisGiven -> DataUI (IDSurface html) fm fs (RecordMsg rmsg) (RecordState rsta) (Record row)

#recordPartial Source

recordPartial :: forall opt html fm fs rmsg rsta row datauisGiven. DefaultRecordPartial Tok opt datauisGiven html fm fs rmsg rsta row => opt -> Record datauisGiven -> DataUI (IDSurface html) fm fs (RecordMsg rmsg) (RecordState rsta) (Record row)

#genericPartial_ Source

genericPartial_ :: forall html fm fs @initsym msg sta a datauisGiven. DefaultGenericPartial initsym Tok datauisGiven html fm fs msg sta a => String -> Record datauisGiven -> DataUI (IDSurface html) fm fs msg sta a

Re-exports from InteractiveData.Core

#IDSurface Source

newtype IDSurface :: (Type -> Type) -> Type -> Typenewtype IDSurface html msg

Instances

#DataAction Source

newtype DataAction msg

Constructors

Instances

#IDHtml Source

class IDHtml :: (Type -> Type) -> Constraintclass (Html html, Ctx IDViewCtx html, RunOutMsg IDOutMsg html, HtmlStyled html) <= IDHtml html 

Re-exports from InteractiveData.Core.Classes.OptArgs

#OptArgs Source

class OptArgs all given 

Instances

Re-exports from InteractiveData.Core.Types.IDHtmlT

#IDHtmlT Source

newtype IDHtmlT :: (Type -> Type) -> Type -> Typenewtype IDHtmlT html a

Instances

Re-exports from InteractiveData.DataUIs

#VariantState Source

#VariantMsg Source

data VariantMsg :: Row Type -> Row Type -> Typedata VariantMsg rcase rmsg

Instances

#TypeName Source

newtype TypeName

Constructors

#TrivialCfg Source

type TrivialCfg :: Row Type -> Type -> Typetype TrivialCfg extraCfg a = { init :: Maybe a, text :: Maybe String | extraCfg }

#StringState Source

newtype StringState

Instances

#StringMsg Source

#RecordState Source

newtype RecordState :: Row Type -> Typenewtype RecordState r

Instances

#RecordMsg Source

newtype RecordMsg :: Row Type -> Typenewtype RecordMsg r

Instances

#Product Source

data Product a b

Instances

#NumberState Source

newtype NumberState

Instances

#NumberMsg Source

#JsonState Source

newtype JsonState

Instances

#JsonMsg Source

data JsonMsg

#IntState Source

newtype IntState

Instances

#IntMsg Source

data IntMsg

#CfgString Source

type CfgString msg = { actions :: Array (DataAction msg), maxLength :: Maybe Int, multiline :: Boolean, rows :: Int, text :: Maybe String }

#BooleanState Source

#BooleanMsg Source

#ArrayState Source

newtype ArrayState sta

Instances

#ArrayMsg Source

data ArrayMsg msg

#GenericDataUI Source

class GenericDataUI :: Symbol -> Type -> (Type -> Type) -> Row Type -> (Type -> Type) -> (Type -> Type) -> Type -> Type -> Type -> Constraintclass GenericDataUI (initcase :: Symbol) (opt :: Type) (html :: Type -> Type) (datauis :: Row Type) (fm :: Type -> Type) (fs :: Type -> Type) (msg :: Type) (sta :: Type) (a :: Type) | datauis opt -> initcase html fm fs datauis msg sta a where

Members

Instances

#variant_ Source

variant_ :: forall datauis html fm fs @initsym rcase rmsg rsta r. DataUiVariant datauis fm fs (IDSurface html) initsym rcase rmsg rsta r => IDHtml html => Record datauis -> DataUI (IDSurface html) fm fs (VariantMsg rcase rmsg) (VariantState rsta) (Variant r)

#variant Source

variant :: forall opt datauis html fm fs @initsym rcase rmsg rsta r. OptArgs CfgVariant opt => DataUiVariant datauis fm fs (IDSurface html) initsym rcase rmsg rsta r => IDHtml html => opt -> Record datauis -> DataUI (IDSurface html) fm fs (VariantMsg rcase rmsg) (VariantState rsta) (Variant r)

#unit_ Source

unit_ :: forall html fm fs. IDHtml html => DataUI (IDSurface html) fm fs Unit Unit Unit

#unit Source

unit :: forall opt html fm fs. IDHtml html => OptArgs (TrivialCfg () Unit) opt => opt -> DataUI (IDSurface html) fm fs Unit Unit Unit

#tuple_ Source

tuple_ :: forall html a b. IDHtml html => DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ b -> DataUI (IDSurface html) _ _ _ _ (Tuple a b)

#tuple Source

tuple :: forall opt html a b. IDHtml html => OptArgs CfgGeneric opt => opt -> DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ b -> DataUI (IDSurface html) _ _ _ _ (Tuple a b)

#string_ Source

string_ :: forall html fm fs. IDHtml html => DataUI (IDSurface html) fm fs StringMsg StringState String

#string Source

string :: forall opt html fm fs. OptArgs (CfgString StringMsg) opt => IDHtml html => opt -> DataUI (IDSurface html) fm fs StringMsg StringState String

#record_ Source

record_ :: forall datauis html fm fs rmsg rsta r. DataUiRecord datauis fm fs (IDSurface html) rmsg rsta r => IDHtml html => Record datauis -> DataUI (IDSurface html) fm fs (RecordMsg rmsg) (RecordState rsta) (Record r)

#record Source

record :: forall opt datauis html fm fs rmsg rsta r. DataUiRecord datauis fm fs (IDSurface html) rmsg rsta r => IDHtml html => OptArgs CfgRecord opt => opt -> Record datauis -> DataUI (IDSurface html) fm fs (RecordMsg rmsg) (RecordState rsta) (Record r)

#number_ Source

number_ :: forall html fm fs. IDHtml html => DataUI (IDSurface html) fm fs NumberMsg NumberState Number

#number Source

number :: forall opt html fm fs. OptArgs CfgNumber opt => IDHtml html => opt -> DataUI (IDSurface html) fm fs NumberMsg NumberState Number

#newtype_ Source

newtype_ :: forall srf fm fs msg sta a b. Newtype b a => TypeName -> DataUI srf fm fs msg sta a -> DataUI srf fm fs msg sta b

#mkTrivialDataUi Source

mkTrivialDataUi :: forall html opt extraCfg fm fs a. IDHtml html => OptArgs (TrivialCfg extraCfg a) opt => Lacks "init" extraCfg => Lacks "text" extraCfg => MkTrivialDataUiCfg html extraCfg a -> opt -> DataUI (IDSurface html) fm fs a a a

#mkMaybe_ Source

mkMaybe_ :: forall html datauis fm fs msg sta a. GenericDataUI "Nothing" (Record ()) html datauis fm fs msg sta (Maybe a) => Record datauis -> DataUI (IDSurface html) fm fs msg sta (Maybe a)

#mkMaybe Source

mkMaybe :: forall opt html datauis fm fs msg sta a. GenericDataUI "Nothing" opt html datauis fm fs msg sta (Maybe a) => opt -> Record datauis -> DataUI (IDSurface html) fm fs msg sta (Maybe a)

#maybe_ Source

maybe_ :: forall html a. IDHtml html => DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ (Maybe a)

#maybe Source

maybe :: forall opt html a. IDHtml html => OptArgs CfgGeneric opt => opt -> DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ (Maybe a)

#json Source

json :: forall given html fm fs a. OptArgsMixed (JsonCfg a) (JsonOptional ()) given => DecodeJson a => EncodeJson a => IDHtml html => given -> DataUI (IDSurface html) fm fs JsonMsg JsonState a

#int_ Source

int_ :: forall html fm fs. IDHtml html => DataUI (IDSurface html) fm fs IntMsg IntState Int

#int Source

int :: forall opt html fm fs. OptArgs CfgInt opt => IDHtml html => opt -> DataUI (IDSurface html) fm fs IntMsg IntState Int

#generic_ Source

generic_ :: forall @initcase html datauis fm fs msg sta a. GenericDataUI initcase (Record ()) html datauis fm fs msg sta a => IDHtml html => TypeName -> Record datauis -> DataUI (IDSurface html) fm fs msg sta a

#either_ Source

either_ :: forall html a b. IDHtml html => DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ b -> DataUI (IDSurface html) _ _ _ _ (Either a b)

#either Source

either :: forall opt html a b. IDHtml html => OptArgs CfgGeneric opt => opt -> DataUI (IDSurface html) _ _ _ _ a -> DataUI (IDSurface html) _ _ _ _ b -> DataUI (IDSurface html) _ _ _ _ (Either a b)

#boolean_ Source

boolean_ :: forall html fm fs. IDHtml html => DataUI (IDSurface html) fm fs BooleanMsg BooleanState Boolean

#boolean Source

boolean :: forall opt html fm fs. OptArgs CfgBoolean opt => IDHtml html => opt -> DataUI (IDSurface html) fm fs BooleanMsg BooleanState Boolean

#array_ Source

array_ :: forall html fm fs msg sta a. IDHtml html => DataUI (IDSurface html) fm fs msg sta a -> DataUI (IDSurface html) fm fs (ArrayMsg (fm msg)) (ArrayState (fs sta)) (Array a)

#array Source

array :: forall opt html fm fs msg sta a. OptArgs (CfgArray a) opt => IDHtml html => opt -> DataUI (IDSurface html) fm fs msg sta a -> DataUI (IDSurface html) fm fs (ArrayMsg (fm msg)) (ArrayState (fs sta)) (Array a)

#(~) Source

Operator alias for InteractiveData.DataUIs.Generic.Product (right-associative / precedence 6)

#type (~) Source

Operator alias for InteractiveData.DataUIs.Generic.Product (right-associative / precedence 6)

Re-exports from InteractiveData.Entry

#DataUI' Source

type DataUI' :: (Type -> Type) -> Type -> Type -> Type -> Typetype DataUI' html msg sta a = DataUI (IDSurface (IDHtmlT html)) WrapMsg WrapState msg sta a

#toApp Source

toApp :: forall html given msg sta a. Html html => OptArgsMixed (ToAppCfg a) (ToAppOptional a ()) given => given -> DataUI (IDSurface (IDHtmlT html)) WrapMsg WrapState msg sta a -> InteractiveDataApp html (AppMsg (WrapMsg msg)) (AppState (WrapState sta)) a

Re-exports from InteractiveData.Run

#getUi Source

getUi :: forall html msg sta a. { initData :: Maybe a } -> DataUiInterface html msg sta a -> UI html msg sta

#getExtract Source

getExtract :: forall html msg sta a. DataUiInterface html msg sta a -> (sta -> DataResult a)
Modules
InteractiveData
InteractiveData.App
InteractiveData.App.EnvVars
InteractiveData.App.FastForward.Inline
InteractiveData.App.FastForward.Standalone
InteractiveData.App.Routing
InteractiveData.App.Types
InteractiveData.App.UI.ActionButton
InteractiveData.App.UI.Assets
InteractiveData.App.UI.Body
InteractiveData.App.UI.Breadcrumbs
InteractiveData.App.UI.Card
InteractiveData.App.UI.DataLabel
InteractiveData.App.UI.Footer
InteractiveData.App.UI.Header
InteractiveData.App.UI.Layout
InteractiveData.App.UI.Menu
InteractiveData.App.UI.NotFound
InteractiveData.App.UI.SideBar
InteractiveData.App.UI.Types.SumTree
InteractiveData.App.WrapApp
InteractiveData.App.WrapData
InteractiveData.Class
InteractiveData.Class.Defaults
InteractiveData.Class.Defaults.Generic
InteractiveData.Class.Defaults.Record
InteractiveData.Class.Defaults.Variant
InteractiveData.Class.InitDataUI
InteractiveData.Class.Partial
InteractiveData.Core
InteractiveData.Core.Classes.IDHtml
InteractiveData.Core.Classes.OptArgs
InteractiveData.Core.FeatureFlags
InteractiveData.Core.Prelude
InteractiveData.Core.Types.Common
InteractiveData.Core.Types.DataAction
InteractiveData.Core.Types.DataPathExtra
InteractiveData.Core.Types.DataTree
InteractiveData.Core.Types.IDHtmlT
InteractiveData.Core.Types.IDOutMsg
InteractiveData.Core.Types.IDSurface
InteractiveData.Core.Types.IDViewCtx
InteractiveData.Core.Util.RecordProjection
InteractiveData.DataUIs
InteractiveData.DataUIs.Array
InteractiveData.DataUIs.Boolean
InteractiveData.DataUIs.Common
InteractiveData.DataUIs.Generic
InteractiveData.DataUIs.Int
InteractiveData.DataUIs.Json
InteractiveData.DataUIs.Newtype
InteractiveData.DataUIs.Number
InteractiveData.DataUIs.Record
InteractiveData.DataUIs.String
InteractiveData.DataUIs.Trivial
InteractiveData.DataUIs.Types
InteractiveData.DataUIs.Variant
InteractiveData.Entry
InteractiveData.Run
InteractiveData.UI.NumberInput
InteractiveData.UI.Slider