Difference between revisions of "Abbreviations"
From HaskellWiki
(SEC - [http://conal.net/blog/posts/semantic-editor-combinators/ Semantic editor combinator]) |
(→An overview of Haskell related abbreviations: rts) |
||
(50 intermediate revisions by 6 users not shown) | |||
Line 1: | Line 1: | ||
− | |||
− | |||
== An overview of Haskell related abbreviations == | == An overview of Haskell related abbreviations == | ||
− | + | Note: if there is an abbreviation you cannot find here, it might be the name of a package, so check the [http://hackage.haskell.org/packages/ Hackage package list]. For GHC related abbreviations, see [https://gitlab.haskell.org/ghc/ghc/wikis/commentary/abbreviations GHC Source Code Abbreviations]. The abbreviation might also indicate a [[Conferences | conference]]. | |
− | Note: if there is an abbreviation you cannot find here, it might be the name of a package, so check the [http://hackage.haskell.org/packages/ | ||
{| | {| | ||
| ABI | | ABI | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/Application_binary_interface Application Binary Interface] |
|- | |- | ||
| ADP | | ADP | ||
− | | [ | + | | [https://bibiserv.cebitec.uni-bielefeld.de/adp/ Algebraic Dynamic Programming] |
|- | |- | ||
| ADT | | ADT | ||
| [[Abstract data type | Abstract Data Type]] / [[Algebraic data type | Algebraic Data Type]] | | [[Abstract data type | Abstract Data Type]] / [[Algebraic data type | Algebraic Data Type]] | ||
+ | |- | ||
+ | | AFAIC | ||
+ | | As Far As I'm Concerned / As Far As I Can | ||
+ | |- | ||
+ | | AFAICS | ||
+ | | As Far As I Can See | ||
+ | |- | ||
+ | | AFAICT | ||
+ | | As Far As I Can Tell | ||
+ | |- | ||
+ | | AFAIK | ||
+ | | As Far As I Know | ||
|- | |- | ||
| AFAIU | | AFAIU | ||
Line 20: | Line 29: | ||
|- | |- | ||
| AFRP | | AFRP | ||
− | | [ | + | | [[Arrows-based Functional Reactive Programming]] |
|- | |- | ||
| AKA | | AKA | ||
| Also Known As | | Also Known As | ||
+ | |- | ||
+ | | alist | ||
+ | | Association list, a list of key-value pairs, [(key, value)] | ||
+ | |- | ||
+ | | AMP | ||
+ | | [https://wiki.haskell.org/Functor-Applicative-Monad_Proposal Applicative-Monad Proposal] | ||
|- | |- | ||
| ANN | | ANN | ||
− | | | + | | ANNouncement / [https://en.wikipedia.org/wiki/Artificial_neural_network Artificial Neural Network] |
|- | |- | ||
| API | | API | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/Application_programming_interface Application Programming Interface] |
|- | |- | ||
+ | | aPToP | ||
+ | | [http://www.cs.toronto.edu/~hehner/aPToP/ A practical theory of programming] | ||
+ | |- | ||
+ | | ASAP | ||
+ | | As Soon As Possible | ||
+ | |- | ||
+ | | AST | ||
+ | | [https://en.wikipedia.org/wiki/Abstract_syntax_tree Abstract syntax tree] | ||
+ | |- | ||
| AT | | AT | ||
− | | [[Abstract data type | Abstract (Data) Type]] / [http://nattermorphisms.blogspot.com/2008/10/2-minute-intro-to-associated-types-type.html Associated (Data) Type] (see also [http:// | + | | [[Abstract data type | Abstract (Data) Type]] / [http://nattermorphisms.blogspot.com/2008/10/2-minute-intro-to-associated-types-type.html Associated (Data) Type] (see also [http://citeseerx.ist.psu.edu/viewdoc/download?doi=10.1.1.646.5887&rep=rep1&type=pdf Associated types with class]) |
+ | |- | ||
+ | | BE | ||
+ | | [https://en.wikipedia.org/wiki/Endianness Big Endian] | ||
|- | |- | ||
| BSD | | BSD | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/BSD_license Berkeley Software Distributions (license)] |
|- | |- | ||
| Cabal | | Cabal | ||
Line 46: | Line 73: | ||
| A programming language | | A programming language | ||
|- | |- | ||
+ | | CFG | ||
+ | | [https://en.wikipedia.org/wiki/Context-free_grammar Context-Free Grammar] | ||
+ | |- | ||
+ | | CFP | ||
+ | | Call For Papers - request to send material for a symposium | ||
+ | |- | ||
+ | | CLC | ||
+ | | [[Core Libraries Committee]] | ||
+ | |- | ||
| CPR | | CPR | ||
− | | [ | + | | [https://www.microsoft.com/en-us/research/publication/constructed-product-result-analysis-haskell/ Constructed Product Result] (analysis) |
|- | |- | ||
| CPS | | CPS | ||
| [[Continuation | Continuation-Passing Style]] | | [[Continuation | Continuation-Passing Style]] | ||
+ | |- | ||
+ | | CSE | ||
+ | | [https://en.wikipedia.org/wiki/Common_subexpression_elimination Common subexpression elimination] | ||
|- | |- | ||
| CUFP | | CUFP | ||
− | | [http://cufp. | + | | [http://cufp.org/ Commercial Users of Functional Programming] |
+ | |- | ||
+ | | DAG | ||
+ | | [https://en.wikipedia.org/wiki/Directed_acyclic_graph Directed acyclic graph] | ||
+ | |- | ||
+ | | DFA | ||
+ | | [https://en.wikipedia.org/wiki/Deterministic_finite_automaton Deterministic Finite Automaton], [https://en.wikipedia.org/wiki/Data_flow_analysis Data Flow Analysis], [https://en.wikipedia.org/wiki/Differential_fault_analysis Differential Fault Analysis] or [https://en.wikipedia.org/wiki/Dual_Factor_Authentication Dual Factor Authentication] | ||
|- | |- | ||
| DPH | | DPH | ||
− | | [[Data Parallel Haskell]] | + | | [[GHC/Data Parallel Haskell | Data Parallel Haskell]] |
+ | |- | ||
+ | | DRY | ||
+ | | [https://en.wikipedia.org/wiki/Don't_repeat_yourself Don't repeat yourself] | ||
|- | |- | ||
| DSEL | | DSEL | ||
Line 63: | Line 111: | ||
| DSL | | DSL | ||
| [[Embedded domain specific language | Domain-Specific Language]] | | [[Embedded domain specific language | Domain-Specific Language]] | ||
+ | |- | ||
+ | |||
+ | | DVCS | ||
+ | | [https://en.wikipedia.org/wiki/Distributed_version_control_system Distributed Version Control System] | ||
|- | |- | ||
| EDSL | | EDSL | ||
| [[Embedded domain specific language | Embedded Domain-Specific Language]] | | [[Embedded domain specific language | Embedded Domain-Specific Language]] | ||
+ | |- | ||
+ | | EHC | ||
+ | | The [https://web.archive.org/web/20160916002228/foswiki.cs.uu.nl/foswiki/Ehc/WebHome Essential Haskell Compiler] | ||
|- | |- | ||
| elt | | elt | ||
Line 71: | Line 126: | ||
|- | |- | ||
| FAQ | | FAQ | ||
− | | Frequently Asked Questions | + | | [[:Category:FAQ | Frequently Asked Questions]] |
|- | |- | ||
| FD | | FD | ||
Line 80: | Line 135: | ||
|- | |- | ||
| FHM | | FHM | ||
− | | [ | + | | [https://db.inf.uni-tuebingen.de/team/GeorgeGiorgidze.html Functional Hybrid Modeling] |
|- | |- | ||
+ | | FPL | ||
+ | | [http://www.haskell.org Functional Programming Language] | ||
+ | |- | ||
+ | | FTFY | ||
+ | | Fixed That For You | ||
+ | |- | ||
| FRP | | FRP | ||
| [[Functional Reactive Programming]] | | [[Functional Reactive Programming]] | ||
+ | |- | ||
+ | | FSF | ||
+ | | [https://www.fsf.org/ Free Software Foundation] | ||
+ | |- | ||
+ | | FTP | ||
+ | | [[Foldable Traversable In Prelude | Foldable/Traversable in Prelude proposal]] | ||
+ | |- | ||
+ | | FTW | ||
+ | | [https://en.wiktionary.org/wiki/FTW For The World / For The Win] | ||
|- | |- | ||
| FunDeps | | FunDeps | ||
| [[Functional dependencies | Functional Dependencies]] | | [[Functional dependencies | Functional Dependencies]] | ||
− | |||
− | |||
− | |||
|- | |- | ||
| FWIW | | FWIW | ||
| For what it's worth | | For what it's worth | ||
+ | |- | ||
+ | | GCC | ||
+ | | [http://gcc.gnu.org/ GNU Compiler Collection] | ||
|- | |- | ||
| GHC | | GHC | ||
− | | [ | + | | [https://www.haskell.org/ghc/ Glasgow Haskell Compiler] |
|- | |- | ||
| GPL | | GPL | ||
| [http://www.gnu.org/licenses/gpl.html GNU General Public License] | | [http://www.gnu.org/licenses/gpl.html GNU General Public License] | ||
+ | |- | ||
+ | | GPL2 | ||
+ | | [http://www.gnu.org/licenses/gpl2.html GNU General Public License, Version 2] | ||
+ | |- | ||
+ | | GPL3 | ||
+ | | [http://www.gnu.org/licenses/gpl.html GNU General Public License, Version 3] | ||
+ | |- | ||
+ | | GSoC | ||
+ | | [https://developers.google.com/open-source/gsoc/?csw=1 Google Summer of Code] | ||
+ | |- | ||
+ | | GUI | ||
+ | | [https://en.wikipedia.org/wiki/Graphical_User_Interface Graphical User Interface] | ||
+ | |- | ||
+ | | HaLVM | ||
+ | | [https://github.com/GaloisInc/HaLVM Haskell Lightweight Virtual Machine] | ||
+ | |- | ||
+ | | HBC | ||
+ | | [https://wiki.haskell.org/Implementations#HBI_and_HBC.2C_Chalmers.27_Haskell_Interpreter_and_Compiler Haskell-B Compiler] | ||
+ | |- | ||
+ | | HBI | ||
+ | | [https://wiki.haskell.org/Implementations#HBI_and_HBC.2C_Chalmers.27_Haskell_Interpreter_and_Compiler Haskell-B Interpreter] | ||
+ | |- | ||
+ | | HCAR | ||
+ | | [https://wiki.haskell.org/Haskell_Communities_and_Activities_Report Haskell Communities and Activities Report] | ||
+ | |- | ||
+ | | HIE | ||
+ | | [https://github.com/haskell/haskell-ide-engine Haskell IDE Engine] (see also [[Haskell Language Server]]) | ||
+ | |- | ||
+ | | HLS | ||
+ | | [[Haskell Language Server]] | ||
+ | |- | ||
+ | | HNF | ||
+ | | [https://encyclopedia2.thefreedictionary.com/head+normal+form Head Normal Form] | ||
|- | |- | ||
| HOAS | | HOAS | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/Higher-order_abstract_syntax Higher-Order Abstract Syntax] (using binding in the host language to represent binding in the embedded language) |
|- | |- | ||
| HOF | | HOF | ||
| [[Higher order function | Higher-Order Functions]] | | [[Higher order function | Higher-Order Functions]] | ||
+ | |- | ||
+ | | HPC | ||
+ | | [[Haskell program coverage | Haskell Program Coverage]], a tool-kit to record and display Haskell program coverage / [https://prime.haskell.org/wiki/Committee Haskell Prime Committee] / High Performance Computing | ||
+ | |- | ||
+ | | HPFFP | ||
+ | | [https://haskellbook.com/ Haskell Programming From First Principles] (book) | ||
+ | |- | ||
+ | | HSE | ||
+ | | [http://hackage.haskell.org/package/haskell-src-exts Haskell-Source with Extensions] (a package on Hackage, haskell-src-exts); an extension of the standard haskell-src package | ||
|- | |- | ||
| HTH | | HTH | ||
| Hope This Helps | | Hope This Helps | ||
+ | |- | ||
+ | | HTML | ||
+ | | [https://en.wikipedia.org/wiki/HTML HyperText Markup Language] | ||
|- | |- | ||
| HUGS | | HUGS | ||
| [[Hugs | Haskell User's Gofer System]] | | [[Hugs | Haskell User's Gofer System]] | ||
+ | |- | ||
+ | | HWN | ||
+ | | [[Haskell Weekly News]] | ||
|- | |- | ||
| I18n | | I18n | ||
Line 120: | Line 238: | ||
| ICFP | | ICFP | ||
| [http://www.icfpconference.org/ International Conference on Functional Programming] | | [http://www.icfpconference.org/ International Conference on Functional Programming] | ||
+ | |- | ||
+ | | IFL | ||
+ | | [[Conferences#Implementation_of_Functional_Languages_.28IFL.29 | Implementation and Application of Functional Languages]], symposium | ||
+ | |- | ||
+ | | IHG | ||
+ | | [http://industry.haskell.org/ Industrial Haskell Group] | ||
|- | |- | ||
| IIRC | | IIRC | ||
| If I Recall Correctly | | If I Recall Correctly | ||
+ | |- | ||
+ | | IIUIC | ||
+ | | If I Understand It Correctly | ||
|- | |- | ||
| IIUC | | IIUC | ||
| If I Understand Correctly | | If I Understand Correctly | ||
+ | |- | ||
+ | | IME | ||
+ | | In My Experience | ||
|- | |- | ||
| IMHO | | IMHO | ||
| In My Humble Opinion | | In My Humble Opinion | ||
+ | |- | ||
+ | | IMNSHO | ||
+ | | In My Not So Humble Opinion | ||
|- | |- | ||
| IMO | | IMO | ||
| In My Opinion | | In My Opinion | ||
+ | |- | ||
+ | | IOW | ||
+ | | In Other Words | ||
+ | |- | ||
+ | | IR | ||
+ | | [http://lambda.uta.edu/cse5317/notes/node5.html Intermediate Representation] in a two-phase compiler | ||
|- | |- | ||
| IRC | | IRC | ||
| [[IRC channel | Internet Relay Chat]] | | [[IRC channel | Internet Relay Chat]] | ||
+ | |- | ||
+ | | ISTR | ||
+ | | I Seem To Recall | ||
+ | |- | ||
+ | | JFYI | ||
+ | | Just For Your Information | ||
+ | |- | ||
+ | | JHC | ||
+ | | [[Jhc|John's Haskell Compiler]]. Compiles to efficient C programs via whole program analysis and other optimizations. | ||
+ | |- | ||
+ | | JVM | ||
+ | | [https://en.wikipedia.org/wiki/Java_Virtual_Machine Java Virtual Machine] | ||
+ | |- | ||
+ | | LE | ||
+ | | [https://en.wikipedia.org/wiki/Endianness Little Endian] | ||
|- | |- | ||
| LGPL | | LGPL | ||
| [http://www.gnu.org/licenses/lgpl.html GNU Lesser General Public License] | | [http://www.gnu.org/licenses/lgpl.html GNU Lesser General Public License] | ||
+ | |- | ||
+ | | LHC | ||
+ | | [https://github.com/Lemmih/lhc LLVM Haskell Compiler]. LHC is a whole-program optimizing backend for the Glorious Glasgow Haskell Compiler | ||
|- | |- | ||
| LHS | | LHS | ||
Line 144: | Line 301: | ||
| LLVM | | LLVM | ||
| [[LLVM | Low-Level Virtual Machine]] | | [[LLVM | Low-Level Virtual Machine]] | ||
+ | |- | ||
+ | | LSP | ||
+ | | [https://en.wikipedia.org/wiki/Language_Server_Protocol Language Server Protocol] (used by the [[Haskell Langauge Server]]) | ||
+ | |- | ||
+ | | LtU | ||
+ | | [http://lambda-the-ultimate.org/ Lambda the Ultimate] (Website) | ||
+ | |- | ||
+ | | LYH | ||
+ | | [http://learnyouahaskell.com/ Learn You a Haskell for Great Good!] | ||
+ | |- | ||
+ | | LYAH | ||
+ | | [http://learnyouahaskell.com/ Learn You a Haskell for Great Good!] | ||
+ | |- | ||
+ | | LYAHFGG | ||
+ | | [http://learnyouahaskell.com/ Learn You a Haskell for Great Good!] | ||
+ | |- | ||
+ | | MFP | ||
+ | | [[MonadFail Proposal]] | ||
|- | |- | ||
| ML | | ML | ||
− | | A programming language / Mailing | + | | A [https://en.wikipedia.org/wiki/ML_(programming_language) programming language] / Mailing List / Machine Learning |
+ | |- | ||
+ | | MMR | ||
+ | | [[Monomorphism Restriction | MonoMorphism Restriction]] | ||
|- | |- | ||
| MPTC | | MPTC | ||
| [[Multi-parameter type class | Multi-Parameter Type Class]] | | [[Multi-parameter type class | Multi-Parameter Type Class]] | ||
+ | |- | ||
+ | | MR | ||
+ | | [[Monomorphism Restriction]] | ||
+ | |- | ||
+ | | MRP | ||
+ | | [https://mail.haskell.org/pipermail/libraries/2015-September/026121.html Monad of no `return` Proposal (MRP)]: Moving `return` out of `Monad` | ||
|- | |- | ||
| MTL | | MTL | ||
− | | [http://hackage.haskell.org/ | + | | [http://hackage.haskell.org/package/mtl Monad Transformer Library] |
+ | |- | ||
+ | | NCG | ||
+ | | [https://gitlab.haskell.org/ghc/ghc/wikis/commentary/compiler/backends/ncg Native Code Generator], a GHC backend | ||
+ | |- | ||
+ | | NF | ||
+ | | [https://encyclopedia2.thefreedictionary.com/Normal+Form Normal Form], in addition to the [https://en.wikipedia.org/wiki/Normal_form explanations in the Wikipedia article], a fully evaluated expression | ||
+ | |- | ||
+ | | nhc98 | ||
+ | | [https://www.haskell.org/nhc98/ Nearly a Haskell Compiler] | ||
+ | |- | ||
+ | | NLP | ||
+ | | [https://wiki.haskell.org/Applications_and_libraries/Linguistics#Natural_language_processing_and_combinatory_logic Natural Language Processing] | ||
|- | |- | ||
| OCAML | | OCAML | ||
− | | A programming language | + | | [http://caml.inria.fr/ Objective Caml] (A programming language) |
+ | |- | ||
+ | | OOM | ||
+ | | Out Of Memory | ||
|- | |- | ||
| OP | | OP | ||
− | | Original Poster (who sent the first e-mail of the current thread) | + | | Original Poster (who sent the first e-mail of the current thread) or Original Post (the first e-mail of the current thread) |
|- | |- | ||
| OT | | OT | ||
| Off-Topic | | Off-Topic | ||
+ | |- | ||
+ | | PADL | ||
+ | | [https://wiki.haskell.org/Conferences#Practical_Aspects_of_Declarative_Languages_.28PADL.29 Practical Aspects of Declarative Languages], symposium | ||
+ | |- | ||
+ | | PM | ||
+ | | Personal Message, a message to someone on a message board, that no one else can read | ||
|- | |- | ||
| POPL | | POPL | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/POPL Principles of Programming Languages, Symposium on] |
+ | |- | ||
+ | | POV | ||
+ | | Point Of View | ||
+ | |- | ||
+ | | ppl | ||
+ | | People | ||
+ | |- | ||
+ | | PR | ||
+ | | [https://help.github.com/en/github/collaborating-with-issues-and-pull-requests/about-pull-requests Pull Request] | ||
+ | |- | ||
+ | | PRNG | ||
+ | | [https://en.wikipedia.org/wiki/Pseudorandom_number_generator Pseudorandom number generator] | ||
+ | |- | ||
+ | | PVP | ||
+ | | [[Package versioning policy]] | ||
+ | |- | ||
+ | | RDP | ||
+ | | [https://awelonblue.wordpress.com/2011/05/21/comparing-frp-to-rdp/ Reactive Demand Programming] | ||
+ | |- | ||
+ | | RFC | ||
+ | | [https://en.wikipedia.org/wiki/Request_For_Comment Request For Comments] | ||
|- | |- | ||
| RHS | | RHS | ||
| Right-Hand Side (of a statement) | | Right-Hand Side (of a statement) | ||
|- | |- | ||
+ | | RNG | ||
+ | | [https://en.wikipedia.org/wiki/Random_number_generator Random number generator] | ||
+ | |- | ||
+ | | RTS | ||
+ | | [https://gitlab.haskell.org/ghc/ghc/-/wikis/commentary/rts Runtime System] | ||
+ | |- | ||
| RWH | | RWH | ||
− | | [http:// | + | | [http://book.realworldhaskell.org/ Real World Haskell], a book about Haskell |
|- | |- | ||
+ | | SAT | ||
+ | | [https://en.wikipedia.org/wiki/Boolean_satisfiability_problem SATisfiability problem] | ||
+ | |- | ||
| SEC | | SEC | ||
− | | [http://conal.net/blog/posts/semantic-editor-combinators | + | | [http://conal.net/blog/posts/semantic-editor-combinators Semantic editor combinator] |
+ | |- | ||
+ | | SHE | ||
+ | | [http://personal.cis.strath.ac.uk/~conor/pub/she/ Strathclyde Haskell Enhancement], an experimental preprocessor for the Glasgow Haskell Compiler | ||
+ | |- | ||
+ | | SICP | ||
+ | | [https://mitpress.mit.edu/sites/default/files/sicp/full-text/book/book.html Structure and Interpretation of Computer Programs] | ||
|- | |- | ||
| SML | | SML | ||
− | | | + | | [https://en.wikipedia.org/wiki/Standard_ML Standard ML, a programming language] |
+ | |- | ||
+ | | SMP | ||
+ | | [https://en.wikipedia.org/wiki/Symmetric_multiprocessing Symmetric Multi-Processing] | ||
+ | |- | ||
+ | | SMT | ||
+ | | [https://en.wikipedia.org/wiki/Satisfiability_Modulo_Theories Satisfiability Modulo Theories] | ||
+ | |- | ||
+ | | SO | ||
+ | | [https://stackoverflow.com/ StackOverflow], a programming question and answer site | ||
+ | |- | ||
+ | | SOE | ||
+ | | [https://wiki.haskell.org/Books#Textbooks Haskell School Of Expression] (title of a book) | ||
+ | |- | ||
+ | | SORF | ||
+ | | [https://gitlab.haskell.org/ghc/ghc/wikis/records/overloaded-record-fields Simple Overloaded Record Fields] | ||
+ | |- | ||
+ | | SPJ | ||
+ | | [https://www.microsoft.com/en-us/research/people/simonpj/ Simon Peyton Jones] | ||
+ | |- | ||
+ | | SPOJ | ||
+ | | [https://www.spoj.com/ Sphere Online Judge], an online judge system with over 9000 problems. The solution to problems can be submitted in over 40 languages, including Haskell | ||
|- | |- | ||
| SQL | | SQL | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/SQL Structured Query Language] |
|- | |- | ||
| STG machine | | STG machine | ||
− | | [ | + | | [https://www.microsoft.com/en-us/research/publication/implementing-lazy-functional-languages-on-stock-hardware-the-spineless-tagless-g-machine/ Spineless Tagless G-machine] |
+ | |- | ||
+ | | STLC | ||
+ | | [https://en.wikipedia.org/wiki/Simply_typed_lambda_calculus Simply Typed Lambda Calculus] | ||
|- | |- | ||
| STM | | STM | ||
| [[Software transactional memory]] | | [[Software transactional memory]] | ||
+ | |- | ||
+ | | SYB | ||
+ | | [[Scrap your boilerplate | Scrap Your Boilerplate]] | ||
|- | |- | ||
| TaPL | | TaPL | ||
− | | [ | + | | [https://www.cis.upenn.edu/~bcpierce/tapl/ Types and Programming Languages] (book) |
|- | |- | ||
| TCM | | TCM | ||
− | | [http://conal.net/blog/tag/type-class-morphism | + | | [http://conal.net/blog/tag/type-class-morphism Type Class Morphism] |
|- | |- | ||
| TCO | | TCO | ||
− | | [ | + | | [https://en.wikipedia.org/wiki/Tail_call_optimization Tail-Call Optimization] |
+ | |- | ||
+ | | TDNR | ||
+ | | [https://gitlab.haskell.org/haskell/prime/-/wikis/Type-Directed-Name-Resolution Type Directed Name Resolution] | ||
+ | |- | ||
+ | | TF | ||
+ | | [[GHC/Type_families | Type families]] | ||
+ | |- | ||
+ | | TFP | ||
+ | | [https://wiki.haskell.org/Conferences#Trends_in_Functional_Programming_.28TFP.29 Trends in Functional Programming], symposium | ||
+ | |- | ||
+ | | TH | ||
+ | | [[Template Haskell]] | ||
+ | |- | ||
+ | | TIA | ||
+ | | Thanks In Advance | ||
+ | |- | ||
+ | | TIL | ||
+ | | Today I Learned | ||
+ | |- | ||
+ | | tl;dr | ||
+ | | Too Long; Didn't Read | ||
+ | |- | ||
+ | | TLDR | ||
+ | | Too Long; Didn't Read | ||
+ | |- | ||
+ | | TMI | ||
+ | | Too Much Information | ||
|- | |- | ||
| TMR | | TMR | ||
| [[The Monad.Reader]] | | [[The Monad.Reader]] | ||
+ | |- | ||
+ | | TTBOMK | ||
+ | | To the best of my knowledge | ||
+ | |- | ||
+ | | UHC | ||
+ | | [https://web.archive.org/web/20170729171806/foswiki.cs.uu.nl/foswiki/UHC Utrecht Haskell Compiler] | ||
|- | |- | ||
| UTF8 | | UTF8 | ||
− | | [http://unicode.org/faq/utf_bom.html#UTF8 Unicode Transformation Format, byte-oriented] | + | | [http://unicode.org/faq/utf_bom.html#UTF8 Unicode Transformation Format, byte-oriented] (also written as UTF-8) |
+ | |- | ||
+ | | VCS | ||
+ | | [https://en.wikipedia.org/wiki/Version_Control_System Version Control System] | ||
+ | |- | ||
+ | | VPS | ||
+ | | [https://en.wikipedia.org/wiki/Virtual_Private_Server Virtual Private Server], a virtual machine for hosting a website | ||
|- | |- | ||
| WHNF | | WHNF | ||
− | | [ | + | | [[Weak head normal form | Weak Head Normal Form]] |
+ | |- | ||
+ | | wrt | ||
+ | | With Respect To, or With Regard To | ||
+ | |- | ||
+ | | XML | ||
+ | | [https://en.wikipedia.org/wiki/XML eXtensible Markup Language] | ||
|- | |- | ||
| YAHT | | YAHT | ||
− | | [ | + | | [https://en.wikibooks.org/wiki/Haskell/YAHT Yet Another Haskell Tutorial] |
|- | |- | ||
| YHC | | YHC | ||
Line 212: | Line 525: | ||
|- | |- | ||
| YMMV | | YMMV | ||
− | | [ | + | | [https://en.wiktionary.org/wiki/your_mileage_may_vary Your Mileage May Vary] |
|- | |- | ||
|} | |} |
Latest revision as of 04:25, 6 March 2021
Note: if there is an abbreviation you cannot find here, it might be the name of a package, so check the Hackage package list. For GHC related abbreviations, see GHC Source Code Abbreviations. The abbreviation might also indicate a conference.