Metadata revisions for AsyncRattus-0.1

Package maintainers and Hackage trustees are allowed to edit certain bits of package metadata after a release, without uploading a new tarball. Note that the tarball itself is never changed, just the metadata that is stored separately. For more information about metadata revisions, please refer to the Hackage Metadata Revisions FAQ.

No. Time User SHA256
-r2 (AsyncRattus-0.1-r2) 2023-10-05T17:43:08Z PatrickBahr f2dc3e54e0f6f4f86ff1f4d2d7fc74d8ff682a6ee2a53d253e8c99e60aa01d2d
  • Changed description from

    This library implements the Async Rattus programming
    language as an embedded DSL. To this end the library
    provides a GHC plugin that checks the stricter typing
    rules of Async Rattus.
    What follows is a brief introduction to the language and
    its usage. A more detailed introduction can be found in
    this <https://bahr.io/pubs/files/asyncrattus-paper.pdf>.
    
    Async Rattus is a functional reactive programming (FRP)
    language that uses modal types to express temporal
    dependencies. In return the language will guarantee that
    programs are productive (in each computation step, the
    program makes progress), causal (output depends only on
    current and earlier input), and have no space leaks
    (programs do not implicitly retain memory over time).
    
    The modal type constructor @O@ (pronounced "later") is
    used to express the passage of time at the type
    level. Intuitively speaking, a value of type @O a@
    represents a computation that will produce a value of type
    @a@ in the next time step. Additionally, the language also
    features the @Box@ modal type constructor. A value of type
    @Box a@ is a time-independent computation that can be
    executed at any time to produce a value of type @a@.
    
    For example, the type of signals is defined as
    
    > data Sig a = a ::: (O (Sig a))
    
    So the current value of the signal is available now, but
    its future state is only available in the next time
    step. Writing a @map@ function for this type of streams,
    requires us to use the @Box@ modality:
    
    > map :: Box (a -> b) -> Sig a -> Sig b
    > map f (x ::: xs) = unbox f x ::: delay (map f (adv xs))
    
    This makes sure that the function @f@ that we give to
    @map@ is available at any time in the future.
    
    The core of the language is defined in the module
    "AsyncRattus.Primitives". Note that the operations on @O@
    and @Box@ have non-standard typing rules. Therefore, this
    library provides a compiler plugin that checks these
    non-standard typing rules. To write Async Rattus programs,
    you must enable this plugin via the GHC option
    @-fplugin=AsyncRattus.Plugin@, e.g. by including the following
    line in the source file:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    
    In addition, you have to annotate functions that are
    written in Async Rattus:
    
    > {-# ANN myFunction AsyncRattus #-}
    
    You can also annotate the whole module as an Async Rattus module:
    
    > {-# ANN module AsyncRattus #-}
    
    Below is a minimal Async Rattus program using the
    "AsyncRattus.Signal" module for programming with signals:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    >
    > import AsyncRattus
    > import AsyncRattus.Signal
    >
    > {-# ANN sums AsyncRattus #-}
    > sums :: Sig Int -> Sig Int
    > sums = scan (box (+)) 0
    
    The <docs/src/AsyncRattus.Signal.html source code of the AsyncRattus.Signal module>
    provides more examples on how to program in Async Rattus.
    An example project using Async Rattus can be found
    <https://github.com/pa-ba/AsyncRattus/tree/master/examples/console here>.
    to
    This library implements the Async Rattus programming
    language as an embedded DSL. To this end the library
    provides a GHC plugin that checks the stricter typing
    rules of Async Rattus.
    What follows is a brief introduction to the language and
    its usage. A more detailed introduction can be found in
    this <https://bahr.io/pubs/files/asyncrattus-paper.pdf paper>.
    
    Async Rattus is a functional reactive programming (FRP)
    language that uses modal types to express temporal
    dependencies. In return the language will guarantee that
    programs are productive (in each computation step, the
    program makes progress), causal (output depends only on
    current and earlier input), and have no space leaks
    (programs do not implicitly retain memory over time).
    
    The modal type constructor @O@ (pronounced "later") is
    used to express the passage of time at the type
    level. Intuitively speaking, a value of type @O a@
    represents a computation that will produce a value of type
    @a@ in the next time step. Additionally, the language also
    features the @Box@ modal type constructor. A value of type
    @Box a@ is a time-independent computation that can be
    executed at any time to produce a value of type @a@.
    
    For example, the type of signals is defined as
    
    > data Sig a = a ::: (O (Sig a))
    
    So the current value of the signal is available now, but
    its future state is only available in the next time
    step. Writing a @map@ function for this type of streams,
    requires us to use the @Box@ modality:
    
    > map :: Box (a -> b) -> Sig a -> Sig b
    > map f (x ::: xs) = unbox f x ::: delay (map f (adv xs))
    
    This makes sure that the function @f@ that we give to
    @map@ is available at any time in the future.
    
    The core of the language is defined in the module
    "AsyncRattus.Primitives". Note that the operations on @O@
    and @Box@ have non-standard typing rules. Therefore, this
    library provides a compiler plugin that checks these
    non-standard typing rules. To write Async Rattus programs,
    you must enable this plugin via the GHC option
    @-fplugin=AsyncRattus.Plugin@, e.g. by including the following
    line in the source file:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    
    In addition, you have to annotate functions that are
    written in Async Rattus:
    
    > {-# ANN myFunction AsyncRattus #-}
    
    You can also annotate the whole module as an Async Rattus module:
    
    > {-# ANN module AsyncRattus #-}
    
    Below is a minimal Async Rattus program using the
    "AsyncRattus.Signal" module for programming with signals:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    >
    > import AsyncRattus
    > import AsyncRattus.Signal
    >
    > {-# ANN sums AsyncRattus #-}
    > sums :: Sig Int -> Sig Int
    > sums = scan (box (+)) 0
    
    The <docs/src/AsyncRattus.Signal.html source code of the AsyncRattus.Signal module>
    provides more examples on how to program in Async Rattus.
    An example project using Async Rattus can be found
    <https://github.com/pa-ba/AsyncRattus/tree/master/examples/console here>.

-r1 (AsyncRattus-0.1-r1) 2023-10-05T17:41:20Z PatrickBahr 26f55599fa8d7fec7388c42e7482daeaa252701d74c48e5f5188a13235308e91
  • Changed description from

    This library implements the Async Rattus programming
    language as an embedded DSL. To this end the library
    provides a GHC plugin that checks the stricter typing
    rules of Async Rattus.
    What follows is a brief introduction to the language and
    its usage. A more detailed introduction can be found in
    this <src/docs/paper.pdf paper>.
    
    Async Rattus is a functional reactive programming (FRP)
    language that uses modal types to express temporal
    dependencies. In return the language will guarantee that
    programs are productive (in each computation step, the
    program makes progress), causal (output depends only on
    current and earlier input), and have no space leaks
    (programs do not implicitly retain memory over time).
    
    The modal type constructor @O@ (pronounced "later") is
    used to express the passage of time at the type
    level. Intuitively speaking, a value of type @O a@
    represents a computation that will produce a value of type
    @a@ in the next time step. Additionally, the language also
    features the @Box@ modal type constructor. A value of type
    @Box a@ is a time-independent computation that can be
    executed at any time to produce a value of type @a@.
    
    For example, the type of signals is defined as
    
    > data Sig a = a ::: (O (Sig a))
    
    So the current value of the signal is available now, but
    its future state is only available in the next time
    step. Writing a @map@ function for this type of streams,
    requires us to use the @Box@ modality:
    
    > map :: Box (a -> b) -> Sig a -> Sig b
    > map f (x ::: xs) = unbox f x ::: delay (map f (adv xs))
    
    This makes sure that the function @f@ that we give to
    @map@ is available at any time in the future.
    
    The core of the language is defined in the module
    "AsyncRattus.Primitives". Note that the operations on @O@
    and @Box@ have non-standard typing rules. Therefore, this
    library provides a compiler plugin that checks these
    non-standard typing rules. To write Async Rattus programs,
    you must enable this plugin via the GHC option
    @-fplugin=AsyncRattus.Plugin@, e.g. by including the following
    line in the source file:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    
    In addition, you have to annotate functions that are
    written in Async Rattus:
    
    > {-# ANN myFunction AsyncRattus #-}
    
    You can also annotate the whole module as an Async Rattus module:
    
    > {-# ANN module AsyncRattus #-}
    
    Below is a minimal Async Rattus program using the
    "AsyncRattus.Signal" module for programming with signals:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    >
    > import AsyncRattus
    > import AsyncRattus.Signal
    >
    > {-# ANN sums AsyncRattus #-}
    > sums :: Sig Int -> Sig Int
    > sums = scan (box (+)) 0
    
    The <docs/src/AsyncRattus.Signal.html source code of the AsyncRattus.Signal module>
    provides more examples on how to program in Async Rattus.
    An example project using Async Rattus can be found
    <https://github.com/pa-ba/AsyncRattus/tree/master/examples/console here>.
    to
    This library implements the Async Rattus programming
    language as an embedded DSL. To this end the library
    provides a GHC plugin that checks the stricter typing
    rules of Async Rattus.
    What follows is a brief introduction to the language and
    its usage. A more detailed introduction can be found in
    this <https://bahr.io/pubs/files/asyncrattus-paper.pdf>.
    
    Async Rattus is a functional reactive programming (FRP)
    language that uses modal types to express temporal
    dependencies. In return the language will guarantee that
    programs are productive (in each computation step, the
    program makes progress), causal (output depends only on
    current and earlier input), and have no space leaks
    (programs do not implicitly retain memory over time).
    
    The modal type constructor @O@ (pronounced "later") is
    used to express the passage of time at the type
    level. Intuitively speaking, a value of type @O a@
    represents a computation that will produce a value of type
    @a@ in the next time step. Additionally, the language also
    features the @Box@ modal type constructor. A value of type
    @Box a@ is a time-independent computation that can be
    executed at any time to produce a value of type @a@.
    
    For example, the type of signals is defined as
    
    > data Sig a = a ::: (O (Sig a))
    
    So the current value of the signal is available now, but
    its future state is only available in the next time
    step. Writing a @map@ function for this type of streams,
    requires us to use the @Box@ modality:
    
    > map :: Box (a -> b) -> Sig a -> Sig b
    > map f (x ::: xs) = unbox f x ::: delay (map f (adv xs))
    
    This makes sure that the function @f@ that we give to
    @map@ is available at any time in the future.
    
    The core of the language is defined in the module
    "AsyncRattus.Primitives". Note that the operations on @O@
    and @Box@ have non-standard typing rules. Therefore, this
    library provides a compiler plugin that checks these
    non-standard typing rules. To write Async Rattus programs,
    you must enable this plugin via the GHC option
    @-fplugin=AsyncRattus.Plugin@, e.g. by including the following
    line in the source file:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    
    In addition, you have to annotate functions that are
    written in Async Rattus:
    
    > {-# ANN myFunction AsyncRattus #-}
    
    You can also annotate the whole module as an Async Rattus module:
    
    > {-# ANN module AsyncRattus #-}
    
    Below is a minimal Async Rattus program using the
    "AsyncRattus.Signal" module for programming with signals:
    
    > {-# OPTIONS -fplugin=AsyncRattus.Plugin #-}
    >
    > import AsyncRattus
    > import AsyncRattus.Signal
    >
    > {-# ANN sums AsyncRattus #-}
    > sums :: Sig Int -> Sig Int
    > sums = scan (box (+)) 0
    
    The <docs/src/AsyncRattus.Signal.html source code of the AsyncRattus.Signal module>
    provides more examples on how to program in Async Rattus.
    An example project using Async Rattus can be found
    <https://github.com/pa-ba/AsyncRattus/tree/master/examples/console here>.

-r0 (AsyncRattus-0.1-r0) 2023-10-03T11:08:22Z PatrickBahr d7243af78dbbcbe9e379cb92b0d79dd3fde12338b67c937050361f0730932dff