Difference between revisions of "Pronunciation"

From HaskellWiki
Jump to navigation Jump to search
(oops, don't separate cons and nil)
(fix formatting and links to ghc users guide)
 
(14 intermediate revisions by 8 users not shown)
Line 1: Line 1:
  +
There was a thread on Haskell-Cafe about [http://www.haskell.org/pipermail/haskell-cafe/2008-January/038756.html how to pronounce Haskell].
Some notes for beginners on how to pronounce those strange Haskell operators etc.
 
   
 
Below are some notes for beginners on how to pronounce those strange Haskell operators and 'read' Haskell programs.
This is just a rough start to this page. Obviously needs more work.
 
   
This can be a table with formal and informal ways of saying various operators and code snippets such as
+
This is meant to be a table with formal and informal ways of saying various operators and code snippets.
   
 
{|
 
{|
 
! Symbol
 
! Symbol
  +
! Pronunciation
! Pronounciation
 
  +
! References
 
|-
 
|-
| <hask> -> </hask>
+
| <hask>::</hask>
  +
| has type (in definitions); at type (in expressions or patterns)
 
|-
  +
| <hask>-></hask>
 
| maps to, to
 
| maps to, to
 
|-
 
|-
| <hask> = </hask>
+
| <hask>=</hask>
 
| is
 
| is
 
|-
 
|-
| <hask> == </hask>
+
| <hask>==</hask>
 
| equals
 
| equals
  +
| [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3A-61--61- Prelude]
 
|-
 
|-
| <hask> /= </hask>
+
| <hask>/=</hask>
| not-equals
+
| not equals
  +
| [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3A-61--61- Prelude]
 
|-
 
|-
| <hask> => </hask>
+
| <hask>=></hask>
 
| is a witness for, implies
 
| is a witness for, implies
  +
| [http://www.haskell.org/tutorial/classes.html Type Classes and Overloading]
 
|-
 
|-
| <hask> . </hask>
+
| <hask>.</hask>
 
| dot (could be used anywhere, but especially in, for example, Data.Char.ord), ring, compose (for example, negate . (+1)), (silent) (for example, forall a. (Num a) => a)
 
| dot (could be used anywhere, but especially in, for example, Data.Char.ord), ring, compose (for example, negate . (+1)), (silent) (for example, forall a. (Num a) => a)
 
|-
 
|-
| <hask> <- </hask>
+
| <hask><-</hask>
 
| drawn from, from
 
| drawn from, from
 
|-
 
|-
| <hask> -< </hask>
+
| <hask>-<</hask>
  +
| arrow application
|
 
  +
| [http://haskell.org/arrows/syntax.html Arrows syntax]
 
|-
 
|-
| <hask> ++ </hask>
+
| <hask>&&&</hask>
  +
| both, fanout
  +
| [http://www.haskell.org/ghc/docs/latest/html/libraries/base/Control-Arrow.html Control.Arrow]
  +
|-
  +
| <hask>|||</hask>
  +
| either, fanin
  +
| [http://www.haskell.org/ghc/docs/latest/html/libraries/base/Control-Arrow.html#v%3A%7C%7C%7C Control.Arrow]
  +
|
  +
|-
  +
| <hask>++</hask>
 
| append
 
| append
  +
| [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v%3A-43--43- Prelude]
 
|-
 
|-
| <hask> >>= </hask>
+
| <hask>>>=</hask>
 
| bind
 
| bind
  +
| [http://www.haskell.org/tutorial/monads.html About monads], [[Monads as containers]]
 
|-
 
|-
| <hask> >> </hask>
+
| <hask>>></hask>
| then
+
| then, sequence
  +
| [http://haskell.org/ghc/docs/latest/html/libraries/base/Prelude.html#v:-62--62- Prelude]
 
|-
 
|-
| <hask> \ </hask>
+
| <hask><*></hask>
  +
| applied over
  +
| [http://www.haskell.org/haskellwiki/Applicative_functor Applicative Functors]
  +
|-
  +
| <hask><|></hask>
  +
| or/alternative
  +
| [https://hackage.haskell.org/package/base-4.12.0.0/docs/Control-Applicative.html#t:Alternative]
  +
|-
  +
| <hask>\</hask>
 
| lambda
 
| lambda
  +
| [[Lambda abstraction]], [http://www.haskell.org/onlinereport/exps.html#sect3.3 Haskell 98 Report]
 
|-
 
|-
| <hask> ! </hask>
+
| <hask>!</hask>
 
| bang; strict (in patterns or data definitions); index (in expressions)
 
| bang; strict (in patterns or data definitions); index (in expressions)
  +
| {{GHCUsersGuide|exts/strict||a section on Bang Patterns}}
 
|-
 
|-
| <hask> : </hask>
+
| <hask>~</hask>
  +
| irrefutable, lazy (in patterns)
  +
|-
  +
| <hask>:</hask>
 
| cons
 
| cons
 
|-
 
|-
| <hask> [] </hask>
+
| <hask>[]</hask>
 
| nil
 
| nil
 
|-
 
|-
| <hask> () </hask>
+
| <hask>()</hask>
 
| unit
 
| unit
 
|-
 
|-
| <hask> (,) </hask>
+
| <hask>(,)</hask>
 
| 2-tuple, pair
 
| 2-tuple, pair
 
|-
 
|-
| <hask> (a,b,c) </hask>
+
| <hask>(a,b,c)</hask>
 
| [3-]tuple [of] a, b, and c
 
| [3-]tuple [of] a, b, and c
  +
|-
  +
| <hask>({)}</hask>
  +
| just as inconvenient to convey grouping verbally, whether it's layout or punctuation
 
|}
 
|}
   
 
{|
 
{|
 
! Example
 
! Example
  +
! Pronunciation
! Pronounciation
 
 
|-
 
|-
 
| <hask>f :: Int -> Int</hask>
 
| <hask>f :: Int -> Int</hask>
Line 72: Line 108:
 
|}
 
|}
   
  +
Thoughts on improving this page:
should we add informal, possibly bad suggestions like "then", "is", "gets"?
 
  +
  +
The tables above would be best split into more columns to distinguish Informal, possibly bad suggestions like "then", "is", "gets", from Formal correct ways of saying the same thing. The Symbols could also be named in a literal way in another column, such as "arrow" or "double-colon". The Description column can be quite brief and a link provided to the relevant wiki page for the operator.
   
  +
Some words, particularly the informal ones, may be good for several different symbols, but these can hopefully be arranged so that their context will make them unambiguous when reading a code snippet.
   
 
[[Category:Syntax]]
 
[[Category:Syntax]]

Latest revision as of 23:05, 24 July 2021

There was a thread on Haskell-Cafe about how to pronounce Haskell.

Below are some notes for beginners on how to pronounce those strange Haskell operators and 'read' Haskell programs.

This is meant to be a table with formal and informal ways of saying various operators and code snippets.

Symbol Pronunciation References
:: has type (in definitions); at type (in expressions or patterns)
-> maps to, to
= is
== equals Prelude
/= not equals Prelude
=> is a witness for, implies Type Classes and Overloading
. dot (could be used anywhere, but especially in, for example, Data.Char.ord), ring, compose (for example, negate . (+1)), (silent) (for example, forall a. (Num a) => a)
<- drawn from, from
-< arrow application Arrows syntax
&&& both, fanout Control.Arrow
||| either, fanin Control.Arrow
++ append Prelude
>>= bind About monads, Monads as containers
>> then, sequence Prelude
<*> applied over Applicative Functors
<|> or/alternative [1]
\ lambda Lambda abstraction, Haskell 98 Report
! bang; strict (in patterns or data definitions); index (in expressions) The GHC Users Guide has a section on Bang Patterns.
~ irrefutable, lazy (in patterns)
: cons
[] nil
() unit
(,) 2-tuple, pair
(a,b,c) [3-]tuple [of] a, b, and c
({)} just as inconvenient to convey grouping verbally, whether it's layout or punctuation
Example Pronunciation
f :: Int -> Int f has type Int to Int

Thoughts on improving this page:

The tables above would be best split into more columns to distinguish Informal, possibly bad suggestions like "then", "is", "gets", from Formal correct ways of saying the same thing. The Symbols could also be named in a literal way in another column, such as "arrow" or "double-colon". The Description column can be quite brief and a link provided to the relevant wiki page for the operator.

Some words, particularly the informal ones, may be good for several different symbols, but these can hopefully be arranged so that their context will make them unambiguous when reading a code snippet.