Metadata revisions for Rattus-0.1.0.0

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
-r3 (Rattus-0.1.0.0-r3) 2020-07-14T12:46:01Z PatrickBahr 074b4a964ac29fc3bd42f9d49e231fcb3e8dfd5a95007eabbf655fa134fed129
  • Changed description from

    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for 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>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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@.
    
    The core of the language is defined in the module
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must mark the functions that are written
    in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or mark the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0
    
    The
    <docs/src/Rattus.Stream.html source code of the Rattus.Stream module>
    provides more examples on how to program in Rattus.
    to
    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for 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>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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 streams is defined as
    
    > data Str a = a ::: (O (Str a))
    
    So the head of the stream is available now, but its tail
    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) -> Str a -> Str 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
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must annotate the functions that are
    written in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or annotate the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0
    
    The
    <docs/src/Rattus.Stream.html source code of the Rattus.Stream module>
    provides more examples on how to program in Rattus.

-r2 (Rattus-0.1.0.0-r2) 2020-07-14T12:29:09Z PatrickBahr 7dceac83b761c10c5fdd0bce6faa9bc81bc301bb94419311babeb268a98c30ea
  • Changed description from

    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for 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>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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@.
    
    The core of the language is defined in the module
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must mark the functions that are written
    in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or mark the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0
    to
    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for 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>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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@.
    
    The core of the language is defined in the module
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must mark the functions that are written
    in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or mark the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0
    
    The
    <docs/src/Rattus.Stream.html source code of the Rattus.Stream module>
    provides more examples on how to program in Rattus.

-r1 (Rattus-0.1.0.0-r1) 2020-07-14T08:41:22Z PatrickBahr 8ae68dcde41f453d4cac70157ad9e5a4edc5710a41c038874f57bba26b151df8
  • Changed description from

    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for Rattus. What follows is a brief
    introduction to the language and its usage. A more
    detailed introduction can be found in this
    <docs/paper.pdf paper>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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@.
    
    The core of the language is defined in the module
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must mark the functions that are written
    in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or mark the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0
    to
    This library implements the Rattus programming language as
    an embedded DSL. To this end the library provides a GHC
    plugin that performs the additional checks that are
    necessary for 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>.
    
    Rattus is a functional reactive programming (FRP) language
    that uses modal types to ensure operational properties
    that are crucial for reactive programs: productivity (in
    each computation step, the program makes progress),
    causality (output depends only on current and earlier
    input), and no implicit space leaks (programs do not
    implicitly retain memory over time).
    
    To ensure these properties, Rattus uses the type modality
    @O@ to express the concept 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@ type modality. 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@.
    
    The core of the language is defined in the module
    "Rattus.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 Rattus programs, one
    must enable this plugin via the GHC option
    @-fplugin=Rattus.Plugin@, e.g. by including the following
    line in the source file (for better error messages we also
    suggest using the option @-g2@):
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    
    In addition, one must mark the functions that are written
    in Rattus:
    
    > {-# ANN myFunction Rattus #-}
    
    Or mark the whole module as a Rattus module:
    
    > {-# ANN module Rattus #-}
    
    Below is a minimal Rattus program using the
    "Rattus.Stream" module for programming with streams:
    
    > {-# OPTIONS -fplugin=Rattus.Plugin #-}
    >
    > import Rattus
    > import Rattus.Stream
    >
    > {-# ANN sums Rattus #-}
    > sums :: Str Int -> Str Int
    > sums = scan (box (+)) 0

-r0 (Rattus-0.1.0.0-r0) 2020-07-13T21:03:06Z PatrickBahr d91383d47b760c4bbf2c933e1b1589ad8bfb16843f667bf66c7f93a36dd5554e