Skip to content

New or Changed Features

Ingo Wechsung edited this page May 10, 2018 · 48 revisions

Release Notes

This page provides a quick overview of added or changed features and when they have been introduced.

May 10, 2018

  • because of the fix for #357, the strictness for some externally used function changes. Published eclipse-plugin 3.25.39 that will be able to work with frege jars that incorporate this fix.
  • published 3.25.41

April 27, 2018

  • start work on major version 3.25 that will contain a rework of the native interface with automatic detection of native classes and functions.
  • removal of so called mutable only types from the standard library

Spring 2018

  • fix dozens of bugs and issues over the course of 2 years
  • enhance kind system to deal with bounded generics and wildcards, extends and super are now keywords
  • publish 3.24.400 as the official 3.24 release based on Java 1.8 or higher
  • the REPL is now part of the releases
  • Frege compiler looks for java dependencies in the source path and compiles them before they're needed

Winter 2015/2016

  • completely new code generation produces generic java code.

Summer 2015

Starting with 3.23.288

November 25, 2015 (3.23.422)

  • Fixed long standing, but unnoticed bug #218. In very unlikely circumstances this bug could lead to java compilation errors, runtime errors (ClassCastException) or, worse, wrong resuls.

  • varibles with apostrophes in their names can be used infix now, like in

    foo `f'` bar
    

November 20, 2015 (3.23.401)

  • Issues fixed: #195, #196, #203
  • DeepSeq/NFData library support
  • Haskell variable lexical syntax. Variable names can now start with an underscore, and apostrophes can appear everywhere in the name.

This change had an impact on name mangling, where we used a leading underscore to make identifiers that would not interfere with user supplied identifiers. In all this places, there is now a '$' sign used. Unfortunately, this breaks binary compatibility. For example, the name of the list concatenation method was _plus_plus and is now $plus$plus. That is, your class files created with earlier versions cannot be used with the new JAR. At the same time, class files compiled with the new JAR cannot be used with earlier JARS. The best is to recompile everything and remove the old versions.

That being said, unless you really, really need it, you can as well stay with the 3.23.370 version, especially as there are even more ground-breaking changes ahead towards the end of the year.

October 18, 2015

  • Change to Haskell class/instance syntax This is a change that breaks source code compatibility in many cases where you have classes and instances defined.

You need at least frege3.23.365 to compile the new syntax.

Here is a brief cheat sheet for adapting your sources:

  --- old                                    --- new
  class C X c => c                           class X c => C c
  instance C (A x, B x) => T x               instance (A x, B x) => C (T x)
  derive Eq T x y                            derive Eq (T x y)

Note that if the instantiated type is syntactically a type application like Maybe a, it must be written in parentheses.

  • Support use of True and False in Frege programs.

October 9, 2015

  • Support Haskell lambda syntax. The following works now:

    f = \a b -> (b,a)

The following is now a syntax error:

  --      Frege: unexpected operator : while trying to parse lambda patterns
  --      Haskell: parse error on input `:'
  s = \x:xs -> xs 

And this is also used to work, but is now an error:

  --      Frege: constructor Maybe.Just demands 1 arguments, but you gave 0
  --      Haskell: Constructor `Just' should have 1 argument, but has been given none
  j = \Just x -> x

Please check your sources. The old syntax should still be fine in most cases, except when the lambda pattern is a constructor pattern with subpatterns, a list pattern or an @ pattern. The latter two will just give syntax errors. In the case of constructor patterns with subpatterns, the constructor is taken as the first lambda argument and the subpatterns are taken as further lambda arguments. This will cause an error in a later pass, because constructors must be fully applied in patterns. See the 3rd example above.

The remedy in all three cases is, of course, to enclose the offending pattern in parentheses.

  • Fixed #175

  • Fixed a bug that made "class not found" errors appear permanently in eclipse plugin.

  • The type RealWorld, which is used as a phantom type on ST to give us IO, is now implemented as a pure native type frege.runtime.Phantom.RealWorld (which is just a marker interface).

The (experimental) idea here is that we can define arbitrary hierarchies of abstract java types and use them in Frege as phantom types of ST. Assume we have defined two such native types, AAA and BBB, and the java type associated with BBB is a subtype of the java type associated with AAA. Then, by the type inference rules, we can embed a ST BBB action in a ST AAA action, but not vice versa. It needs yet to be seen if this can be used to separate certain kinds of effects (like database, graphics, STM) and their associated mutable values.

Actually there already exist two subtypes of frege.runtime.Phantom.RealWorld: frege.runtime.Phantom.FregeFX and frege.runtime.Phantom.STM.

August 28, 2015

  • Several issues fixed

  • Data.Map is now Data.TreeMap (as opposed to Data.HashMap) and has API like Haskells Data.Map.

  • It turned out in #165 that the runtime support for regular expression matching will not work with JDK9. Thus, drastic changes had to be made that may fail compilation for older programs. Please see the doc. The most important changes are:

    1. Matcher doesn't exist anymore, use MatchResult instead.

    2. replaceAll and replaceFirst are now members of String. Here is an example of how to correct old code:

       -- old
       (´foo|bar´.matcher "foo or bar").replaceFirst "baz"
      
       -- new
       "foo or bar".replaceFirst ´foo|bar´ "baz"
      

Winter 2015, Releases 3.22.xxx where xxx > 324

Patches will be downloadable from the "Winter 2015" release. When severe bugs are fixed, the previous patch will usually be removed.

August 15, 2015 Releae 3.22.535

  • Includes patch for Issue #158

April 8, 2015, Release 3.22.524

  • Module Data.HashMap provides a well documented hash map implementation based on hash mapped array tries.

  • Module frege.prelude.Floating is gone. The Floating class moved to frege.prelude.Math and supports all functions from java.lang.Math which itself is replicated in frege.java.lang.Math, but note that the functions there are overloaded and thus unpleasant to use. Therefore, if you need to do number crunching with floating point numbers, just import Prelude.Math and you're ready to go.

  • Fixed Issue#192. It is now an error to write a type like Mutable s BufferedReader when BufferedReader is declared mutable native.

  • A new definition syntax makes it possible to let the class generated for the module extend some other class and implement some instances. In addition, arbitrary java code can be supplied verbatim. See also here.

  • Fixed Issue#125, where a mutable native type could be unified with a non mutable native one.

  • Fixed Issue#126, where instance definitions couldn't handle aliases in the where clause of type definitions.

  • The Byte and 'Short' types are now fully supported, with instances for Show, Eq, Ord, Enum, Bounded, Num and Integral. All the instances treat them as unsigned quantities, much to the grieve of hardcore Java fans. However, there are functions Byte.signed and Short.signed that get the signed value. (You would not believe how many Java programmers sincerely believe that bytes and short integers are signed, rather than that they are interpreted as signed. This is because they don't have a clue how 2s-complement representation works, and in discussions drivel something about allegedly existing "sign bits" ...)

  • There is support for JSON in module Data.JSON. It is possible to parse JSON strings to an internal format, convert such JSON values to Frege values and back, and showing JSON values, which again results in valid JSON text.

February 7 2015, Release 3.22.367

  • Fixed Issue#102, where the compiler didn't check the types of constructor fields rigidly enough.

February 2 2015, Release 3.22.365

  • Several issues fixed

  • New functionality for the Eclipse Plugin: "annotate definition" content proposal, documentation of fixity and precedence of operators in scope.

  • Generalisation of the underscore construct _.foo. For example, when we write

    s.startsWith "foo"

we assume that this means

`String.startsWith s "foo"`

and this now also holds for

`_.startsWith "foo"`

which means

`\it -> it.startsWith "foo"`

and not, as it used to be

`(\it -> it.startsWith) "foo"`

which is the same as

`"foo".startsWith`

and thus shifted the argument unexpectedly to the front.

  • fixed handling of infix expressions and implemented fixity resolution according to the Haskell 2010 Report, as outlined in section 10.6. In short: When resolving an expression a ⊗ b ⊠ c, then either the operators must have different precedences or they must have the same associativity. In addition, it must not be two non-associative operators of the same precedence, hence a == b == c is invalid.

January 10 2015, Release 3.22.324 (first "Winter 2015" release)

The lions share of the changes concern modularization and purification of the compiler and are not immediatly visible to the user. The compiler is now 100% pure, using a StateT/IO monad transformer.

  • Lexical recognition of operators has been overhauled, and is now more Haskellish. A character for which the predicates Char.isWhitespace and Char.isLetter are both false and that is not an ASCII digit and not one of ``´'",;{}is taken as an operator character. A non-empty sequence of operator characters, then, is either an operator name, or one of the reserved symbols<-`, `->`, `=>`, `::` or `..`. Infix expressions are reordered only in later passes, when the associativity and precedence of the functions that have an operator name is known.

The adavantage is that source files can be parsed without knowing the precdence and associativity of imported operators. Operationally this means that the lexical analysis pass does not need to load classes.

Also, it is not necessary anymore to write operators in accent marks in infix definitions.

Note that operators bound in let or where blocks cannot be assigned individual precedences and associativity, that is, infix definitions work only for non-local items. Local operators are therefore doomed to be non-associative with highest precedence.

  • Unicode support for arrows (← U+2190 LEFTWARDS ARROW, → U+2192 RIGHTWARDS ARROW, ⇒ U+21D2 RIGHTWARDS DOUBLE ARROW), double colon (∷ U+2237 PROPORTION), the arithmetic sequence operator (… U+2026 HORIZONTAL ELLIPSIS) and forall (∀ U+2200 FOR ALL). If those characters appear on their own and are not part of an operator name, they are taken as the special symbols <-, ->, =>, ::, .. or the keyword forall, respectivly.

Unless forbidden by the user through the -ascii flag, compiler, IDE and tools will use that notation to present types. Type variable names can be generated in greek, fraktur or latin letters.

  • Regular expressions must be written in ´acute accent marks´ (U+00B4 ACUTE ACCENT), the older form #in number signs# is not supported anymore. In addition, and in order to make things easier on keyboards that don't have acute accent marks, one can write regular expressions in 'apostrophes' as long as this couldn't be interpreted as a character literal. In other words, a string in apostrophes that is not a valid character literal will be interpreted as regular expresion literal. Note that a regular expression that looks for a single character X can be written as (?:X) instead of just X, so it should always be possible to disambiguate between character and regular expression literals.

  • '\uxxxx' is a valid character literal if the x are hexadecimal digits.

  • Complete overhaul of the -make compiler option. See the compiler manpage.

  • Expression syntax aligned with Haskell. if, case, let and lambda expressions now have a higher precedence than infix expressions. do { ... } remains a term, though, as this is even better than Haskell and should not hurt during porting.

  • Data.Bits ported from Haskell

  • String.format and PrintWriter.printf with up to 9 arguments to format (not type safe, though)

  • support for java.lang.ProcessBuilder and related types through module frege.java.lang.Processes

  • Java package java.util fully frege-ized in module frege.java.Util

Pre 3.22

March 26, Rel. 500

  • a [Char] is now printed as string, like in Haskell.

  • forkIO and forkOS are different now. The former submits a task in a fixed size thread pool executor which is provided by the runtime. The latter, as before, creates an OS thread.

  • In IDE mode, compiler will replace unresolved variables with undefined, and will continue working, up to and including type check. This makes it probable that unrelated code (and in many cases also code near the error, as undefined shouldn't introduce type errors) can still get typechecked, and IDE features like content assist will be able to do better work.

  • Syntactic sugar: _.foobar desugars to (\it -> it.fooBar). This will typecheck if and only if: the argument type of the lambda is not a type variable and the type of the argument has a foobar function or foobar is a class operation. A successful type check will rewrite the lambda like (\it -> T.fooBar it), where T is the type constructor of the type of it. Later, a simplifying compiler pass will un-eta-expand the lambda, and the result is just T.fooBar. This way, we can TDNR a function even if we have no actual syntactic argument it is applied to! This comes in handy in point free or monadic context:

    letters = packed . filter _.isLetter . unpacked
    foolines sss = openReader sss >>= _.getLines >>= return .  any (flip _.startsWith "foo")
    

The first example filters the letters of a string. The second one tells if a named file contains lines that start with "foo". Apart form saving a few keystrokes, the _.foobar notation is immune against changes of the type name. Also, you do not even have to be able to name the type taht contains foobar.

  • Access to characters in strings doesn't work anymore with syntax str.[index]. Use charAt. The syntactic sugar is only valid for arrays.

March 1, 2014: Spring '14 Release

  • Quickcheck 2.6 ported from Haskell

  • Quick, a tool to run Quickcheck properties of a module, or several modules. (If you try this on the fregec.jar, there will be 2 failing tests. No worries!)

  • better documentation, especially for overloaded native functions

  • native array support via JArray

  • better Unicode support in the scanner, who used to ignore surrogate pairs. Also, everything that is not explicitly uppercase is treated as lowercase, as far as Frege is concerned. This means, you can now write variable names in scripts that do not have case (like Devanagari). Caveat: the scanner still does not recognize glyphs, that is, if I have a german keyboard, I can enter ä and it will be U+00E4 LATIN SMALL LETTER A WITH DIAERESIS, which is a letter and hence acceptable in identifiers, but if one enters the canonical decomposition ä U+0061 LATIN SMALL LETTER A + U+0308 COMBINING DIAERESIS it won't be recognized as identifier part, becasue the scanner still operates on single unicode points, and the diaresis is not a letter, but a non-spacing mark. Arguably, improvements are possible here.

  • Regex literals also are more Unicode-ish, they are being compiled with UNICODE_CASE; CANON_EQ and UNICODE_CHARACTER_CLASS flags.

  • fixed a bunch of issues

  • made the compiled code faster (and, unfortunately, at the same time bigger)

  • added a head-strict cons operator (!:). This means that in x+3 !: ys, for example, x+3 is evaluated right away, while ys is still lazy. List comprehension uses this, which often results in better code with less laziness overhead. If one needs to allow for undefined elements in the list, one must use map or the list monad.

  • the type unsafe special native return type [a] is no longer recognized. Use JArray to tell Frege that a Java method returns an array.

  • cleaned up the handling of let bound functions. Until now, local functions that did not reference any local name from their outer scope were silently moved to the top level. This often resulted in more general types, though this is seldom necessary. From now on, if you want your local function to have a polymorphic type, you need to annotate it or write it as top level function right away. Unannotated let bound functions are thus never generalised by the type checker, which brings more consistency and often better code. Still, if the function doesn't use local variables from the enclosing scope, it might get moved to the top level so as to avoid inner classes. This is now also documented in the language reference and the "Differences to Haskell".

  • main can now have type IO a or [String] -> IO a for some type a. If a is not (), you need to annotate it, though. If the frege main function returns IO Int or IO Bool and if it is run through the supplied static void main(String args) java method (i.e. as command line application), the returned value will be used to determine the exit status, where 0 or true signal success. If main is not annotated and doesn't look like a function, it is assumed to be IO (). Otherwise, if it has arguments, [String] -> IO () is assumed, as before.

  • implemented several convenience functions of Haskell heritage: on, interact, readFile, writeFile, appendFile, getContents and, as substitute for Haskell's hGetContent we have getContentsOf which operates on a Reader.

  • improved type directed name resolution (TDNR). This means, that expressions of the form x.m where x is an expression and m is an identifier, will always (I hope!) be typeable, whenever the type of x can be determined at all. The non-globalised lets contribute here because there is more code where the type of x may get disclosed, but the algorithm I used up to now also had a flaw that prevented proper typing in some cases. The better TDNR also applies to the other syntactic forms that trigger it: x.{m?} x.{m=v} and x.{m<-f}

November 8, 2013: 165th Birthday Release

  • Liberalized type synonyms

We can now write:

type Discard a = forall b. Show b => a -> b -> (a, String)

August 8, 2013: Summer release 3.21.190

  • flexibly typed numeric literals

One can now write, for example

recip x = 1/x

and it will be typed Double -> Double. See examples/NumericLiterals.fr for rules and examples.

  • Quick check command line tool to check properties of already compiled modules, try

    java -cp fregec.jar frege.tools.Quick

  • bug fixes

  • slight performance enhancements

local values are not inlined when marked strict inlining of the remaining ones works now better annotated local values get globalized, when they are constants

February 28, 2013: Reworked design for native data and functions.

  • Mutable native data/impure native functions:

As of version 3.21.107, older code dealing with mutable native data will probably cease to work. (Yet, the changes needed to get it working again are usually small, and should be confined to native declarations.)

The new design has been applied to all library stuff. For explanations, please see the latest language reference, chapter 8.2.

  • Operators can now be qualified like everything else

It used to be so that qualified operators lost their syntactic magic. This has been fixed.

  • Standard I/O

There are now 3 predefined input/output channels available in each program: stdin, stdout and stderr These are really BufferedReader (for stdin) and PrintWriters (for stdout and stderr) wrapped around the streams in java.lang.System.in, .out and .err.

The standard channels provide UTF-8 decoding/encoding, no matter what Java thinks the standard encoding should be. The print writers have the autoflush option set.

The following functions are available that operate on stdout: print, println, putChar, putStr, putStrLn.

The following functions are availabe that operate on stdin: getChar, getLine

There are two functions for dealing with files:

openReader :: String -> IO BufferedReader
openWriter :: String -> IO PrintWriter

Buffered readers support: read, readLine, getChar, getLine, getLines

The read functions return special values like -1 or Nothing on end of file, while the getChar and getLine functions throw EOFException.

Print writers support: print, println (unlike Prelude.print, they take strings, not instances of Show), putChar and write.

February 10, 2013: Overloaded native functions

It is now possible to deal with overloaded java methods or constructors by simply declaring multiple types for their Frege counterparts:

data Writer = native java.io.Writer where
    native write :: Writer -> Int -> IO () throws IOException
                 |  Writer -> String -> IO () throws IOException
                 |  Writer -> String -> Int -> Int -> IO () throws IOException

In the type checker, the left-right bias for constructs like x.m has been removed. This used to type check only if the type of x was known before the type checker hit the expression. Now, resolution will succeed if the type of x is known in the surrounding function at all.

February 3, 2013: Exception Handling

Exception handling has been re-worked, as will be described in the upcoming overhauled language spec. In short:

  • Native functions can now catch different exceptions

This enhances the catch-all approach taken up to now. The exceptions are encoded in an Either type as before, but if there is more than one exception, the left part of the Either type will be another Either, like

Either (Either (Either Ex1 Ex2) Ex3) Result

This either catches one of the exceptions Ex1 , Ex2 or Ex3 , or returns a result of type Result A bit syntactic sugar helps with such complex types: Firstly, the notation

(Ex1|Ex2|Ex3|Result)

is equivalent to the above type, in fact, every Either type can be written (a|b) The vertical bar acts like a left associative operator hence (a|b|c) = ((a|b)|c) Second, the function either is now itself left associative, and there is the nice property that one can deconstruct a nested Either value whose type is (a|b|c) with

(fa `either` fb `either` fc) value

Take the type, replace each vertical bar with an infix either and each sub-type with a function that takes this type and apply this to the value to get deconstructed! This works for any nesting depth.

  • Exception handling in the ST/IO Monad

Native impure functions can now have throws clauses, where the thrown exception types can be listed. An exception type is an immutable abstract type based on some java exception, like:

data IOException = pure native java.io.IOException
derive Exceptional IOException

Support for exception handling is in module frege.prelude.PreludeIO with functions catch finally try and throwST (these functions are available by default). This works now like described in detail in the upcoming language spec.

January 21, 2013: Arithmetic Sequences

We now have the functions enumFrom, enumFromThen , enumFromTo , enumFromThenTo in class Enum , and arithmetic sequences are syntactically supported.

All forms of arithmetic sequences of trivial types like () produce a singleton list where the list element is the only possible value of that type.

Float and Double do not have instances for Enum , hence there are no floating point arithmetic sequences. (Though there is nothing that prevents one from rolling one's own.)

Available from 3.21.33-g5e7b72f

January 8, 2013: New runtime system, minor library changes, strict/non-strict fields in constructors

The new runtime system is more othogonal than the previous one, and allows faster code generation. Unless you want to call frege code from java, it is of no concern. Except that now native methods that are declared to return lists are expected to return arrays or Iterables, and the result is converted to a frege list no matter what the element type of the list is. The data in the java array/Iterable must of course be assignment-compatible with the given element type.

In the course of sweeping up, the package frege.rt is gone, and has been replaced by frege.runtime. Also, there are no more java classes frege.RT and frege.MD, the corresponging code is now in frege.runtime.Runtime and frege.runtime.Meta.

Likewise, the frege modules frege.j. have moved to frege.java.. The module frege.IO is considered deprecated and will be removed in the near future. All Java SE stuff can be imported henceforth from frege.java.Xyz where Xyz is the capitalized last component of the Java package name.

Until now it was possible to state that all fields of a data constructor should be strict, like in:

data Foo = !Bar {field1::X, field2::Y}

From now on, this syntax is considered deprecated (yet it will continue to work for a while). Instead, individual fields can now be marked strict:

data Foo = Bar {!field1::X, !field2::Y}  -- new syntax for the above

This makes it possible to have strict as well as non-strict fields in one constructor.

Last but not least, the version number now contains the first 7 digits of the commit SHA, so that it may be easier to look up what changes went in a given version. For example, the version 3.21.8-geeec484 corresponds to eeec484d18724617e4baf0cab4206ac3a03fff21.

October 31, 2012: Type checker aware of Java sub/superclass relationships, support for returned arrays and Iterables

Up to now, the type checker checked native types just like any other frege type. Very much simplified this boils down to check whether type constructors match.

From now on, if two native types are matched, the type checker considers it ok if the java type associated with the expected type is a super class or super interface of the one associated with the inferred type.

In addition, if we have x.m and the type of x is some T ... and T is a native type, all known namespaces of types that are associated with the java type that is associated with Tare searched for m.

Here is a short example:

package frege.java.Net where

data URL s = native java.net.URL where
    native new              :: String -> IO (Exception (URL Immutable))
    native openStream       :: URL Immutable -> IO (Exception (InputStream RealWorld))
    -- more methods ommitted

protected data InputStream a  = native java.io.InputStream

This defines the URL type. The return type of openStream is InputStream. Another file contains this:

package frege.java.IO where

--- The normal form of an InputStream -- 'RealWorld' (mutated by IO actions)
type InputStream = InputStreamT RealWorld
type Closeable   = CloseableT   RealWorld

--- frege equivalent of @java.io.InputStream@
data InputStreamT s = native java.io.InputStream where
    native read  :: InputStream -> IO (Exception Int)
    -- more methods ommitted

--- frege equivalent of @java.io.Closeable@    
data CloseableT s = native java.io.Closeable where    
    native close :: Closeable -> IO (Exception ())

Here, we have a more detailed definition of InputStream. Now we can use this like so:

import Java.Net
import Java.IO

main _ = do
    url  <- URL.new "http://www.google.com" >>= either throw return
    ios  <- url.openStream                  >>= either throw return
    byte <- ios.read                        >>= either throw println
    ios.close 
    return ()

The variable ios has type Net.InputStream RealWorld, but because the type constructor is associated with java.io.InputStream also IO.InputStreamT is searched for method read, which is found there.

This method expects a IO.InputStreamT RealWorld but the different type constructor is ok, because it is also associated with java.io.InputStream.

The same mechanism works with super-classes and super-interfaces. The expression ios.close looks for close in all types that are associated with any known super-class or super-interface of java.io.InputStream, and since the latter implements java.io.Closable it is found there. The rewritten expression ClosableT.close ios type checks, because the inferred type for ios, namely Net.InputStreamdenotes a java type that is a subtype of the java type that is associated with the expected type ClosableT RealWorld.

This sounds more difficult than it is. In reality, the Frege compiler does some reflection on all java types it learns from the program text or imported packages and tries to do what one expects anyway.

This gives us the opportunity to more easily interface with Java. We don't need to model the class hierarchy anymore with Frege type classes. Rather, we just name the classes and methods we're interested in. In addition, we should never face the situation where we want to import package java.A from java.B, while at the same time we need to import java.B from java.A. We can just use simple "forward" declarations (like the one for InputStream in frege.java.Net) in java.A for all java types introduced in java.B and vice versa.

Another change is that a native method whose declared return type is [R] where R is a type associated with a Java reference type J, will be good for corresponding java methods that return a J[] or an Iterable<J>. In both cases the result is converted to a list. If the method returns null this will result in an empty list. Any null values in the array or the Iterable are skipped. The conversion is strict in the case of arrays, but lazy with Iterable. The latter is because we can traverse the Iterable only once. Hence the list would come out in reverse order if we created it all at once.

The changes will be available from version 3.20.42 on, this corresponds to commit 24d21431.

October 11, 2012: Single . can act as function composition operator

To further enhance Haskell compatibility, the token . will be regarded as if it was if (at least) one of the following conditions holds:

  1. The token preceeding . is (
  2. The token following . is )
  3. The tokens on both side of . are separated by whitespace.

Note that we speak here about the token . not about the character. Hence, the dots in qualified names and multi-character operators like .. are not affected.

Here is an example:

x = (.) f g    -- by rules 1 and 2 same as (•) f g
x = (f.) g     -- by rule 2        same as (f•) g
x = (.g) f     -- by rule 1        same as (•g) f
x = f . g      -- by rule 3        same as f • g

Note that it is not possible to mention a single . in an infix declaration. This would be like saying: We have 3 planets between sun and earth: merkur, the morning star and the evening star.

It is possible that this change breaks existing code. Yet, in the some 30.000 lines of the frege system there was only 1 instance where this happened. Hence, it looks like the benefits outweigh the possible harm.

May 2012: Instances for function types fully supported

There are no restrictions anymore regarding function instances. All of the following can be used now:

instance C1 (->)
instance C2 (->) a   -- sorry, not (a ->)
instance C3 (a -> b) -- or, likewise (->) a b

May 2012: Polymorphic record fields

The type of any record field can now be polymorphic, i.e. it may introduce type variables that are not parameters of the data type the constructor that contains the record field belongs to. Here is a simple example:

data F b = F { fun :: forall a. b a -> b a }

foo :: F []
foo = F reverse

bar :: F m -> m a -> m b -> (m a, m b)
bar F{fun} as bs = (fun as, fun bs)

baz = bar foo [0,1] [true,false]          -- ([1,0], [false, true])
drp = bar (F (drop 1)) [0,1] [true,false] -- ([1], [false])

The example is a bit contrived insofar as bar could be made simpler by just taking a rank 2 function instead of a record that holds a rank 2 function.

Clone this wiki locally