J语言 (Chinese Wikipedia)

Analysis of information sources in references of the Wikipedia article "J语言" in Chinese language version.

refsWebsite
Global rank Chinese rank
1st place
1st place
low place
low place
1,185th place
809th place
low place
low place
4,153rd place
low place
383rd place
336th place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place
low place

acm.org

dl.acm.org

  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In 1989, Iverson, together with Roger Hui and with input from Arthur Whitney, produced J, with a goal of providing a “shareware” APL implementation for use in teaching. The special APL characters were abandoned because it was felt that they require technical solutions which at that time were still prohibitively expensive in an educational environment. ……
    J was clearly a “rationalization” of SHARP APL. ……
    ACM SIGAPL, the ACM Special Interest Group on APL, reinterpreted the “APL” in its name in early 2009 as Array Programming Languages, so that J, k, Nial, etc. would be included in its purview.
     
  • Robert Bernecky英语Robert Bernecky, Roger K. W. Hui. Gerunds and representations. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Gerunds, verbal forms that can be used as nouns, are recognized as having utility in the realm of programming languages. We show that gerunds can be viewed as arrays of atomic repmentations of verbs (functions), in a way which is consistent with the syntax and semantics of APL, and which allows verbs to be first class objects in the language. We define derivations of verbs from gerunds in the J dialect of APL, and show how these derivations provide control structures for sequencing, selection (in the sense of generalized forms of CASE or SWITCH statements and IF/THEN/ELSE), iteration (DO UNTIL), recursion, and parallel computation (MIMD, or Multiple Instruction, Multiple Data). We conclude with alternative representations of verbs which are useful in other contexts. 
    Jsoftware. Changes in Version 4.0, 1991 11 23. 1991 [2022-06-12]. (原始内容存档于2022-06-14).
    `:1    replaced by u^:v
    `:4    replaced by m~
    `:5    replaced by @.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). For years, Iverson struggled to achieve in APL the effect of f+g and f×g as they are written in calculus. …… Finally, trains AKA forks were invented [Iverson and McDonnell 1989]. ……
    Moreover, (f … h p q r) ↔ (f … h (p q r)), and an isolated sequence of two functions is also assigned a meaning (atop, described below), so that a train of any length, even or odd, is interpreted. ……
    Subsequently, it was realized that trains greatly increase the possibilities for “tacit definition”, expressions consisting of compositions of functions which do not explicitly mention the arguments [Hui et al. 1991]. Trains are implemented in several dialects: J [Hui et al. 1991], NARS2000 [Smith 2020], NGN APL [Nickolov 2013], and Dyalog APL [Scholes 2013]. ……
    The expressive completeness of trains depends on an atop composition of two functions …… Dyalog APL defines 2-trains as atop. That, together with the functions (left) and (right), allows many common compositions to be written as trains.
     
  • Bob Smith. Nested arrays, operators, and functions. 1981 [2022-06-19]. (原始内容存档于2022-06-20). The data structures of APL are rectangular, multi-dimensional, and flat -- the latter term meaning that all items of arrays are simple scalars. ……
    In general, a system with nested arrays extends the power of APL by being able to represent data of non-zero depth. Also, in keeping with the past, the system includes a set of primitive functions and operators, tailor-made for manipulating these new data structures.
    Continuing the above example, the names of the months of the year are best represented in a 12-item vector whose items are each character vectors. This structure has a depth of one. Note that because the individual names are in separate items, we need no longer resort to artifices like pad characters. Moreover, explicit delimiters are not needed as the separation between items is represented through structure rather than data. This particular representation is called a vector of vectors, and can be created as follows:
        MONTHS ← ('JANUARY') ('FEBRUARY') ...
    The above line also illustrates strand notation, used to enter a nested vector in a simple and convenient manner. ……
    Of the several new operators, the only one specific to nested arrays is the each operator(symbol ¨), which is monadic as an operator, and produces an ambivalent derived function. It is used to apply the f unction which is its argument to the items of an array to produce corresponding items in the result. For example, to determine the length of the names of the months in the above example, use
        ⍴¨MONTHS
    (7) (8) (5) (5) (3) (4) (4) (6) (9) (7) (8) (8)
    Since monadic rho returns a vector , each item of the above result is a vector (specifically in these cases a one-item vector). The parentheses in the display indicate that the item is not a simple scalar.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In order to provide users with access to APIs and frameworks, APL language designers searched for ways to integrate into APL, where everything is an array, selected aspects of the OO paradigm, where everything is an object. ……
    Some interpreters, like APL+Win, avoided incorporating objects into the APL heap (or “workspace”). ……
    Other systems added features which allowed variables, functions and operators to be organized in dynamic objects in the workspace. The resulting containers are known as namespaces (Dyalog APL) and locales (J). k implements dictionaries, which are also containers for arrays, but are typically used to contain arrays representing the columns of a relational table. …… The same language features which supported namespaces or classes within APL were used to wrap the external objects used by object oriented APIs, or platforms like the Microsoft’s OLE and .NET frameworks.
    The choice of syntax for referring to a member name of an object emp was not straightforward. ……
    Most APL systems did adopt the notation from other OO languages — with a few exceptions.
      emp.name    in most APL systems
      name__emp   in J (retaining right-to-left evaluation)
      emp[`name]  in k (using a symbol within index brackets to select from a dictionary)
    ……
    Although APL interpreters have had extensive support for object oriented programming for nearly two decades, most APL users still feel that object and array paradigms are an awkward fit. …… Many of the benefits of OO are related to taking advantage of types, while much of the strength of the APL family is that you can write code which is shape, rank, and type agnostic — achieving many of the same goals as OO through radically different mechanisms.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In the dyadic case, two frames lf and rf are involved, from the left and right arguments. Several different treatments are possible:
    • scalar agreement: (lf≡rf)∨(lf≡⍬)∨(rf≡⍬), the left and right frames match, or one is the empty vector (). If the frames match, there are an equal number of left and right cells, and the operand function applies to corresponding cells. If they do not match, one frame must be , that is, there is one cell on one side, whence that one cell is applied against every cell on the other side. Scalar agreement is implemented in Dyalog APL [Dyalog 2015].
    • prefix agreement: (p↑lf)≡(p↑rf) ⊣ p←(≢lf)⌊(≢rf), one frame must be a prefix of the other. Let ff be the longer frame (that is, ff←lf,p↓rf). In this case a cell of the argument with the shorter frame is applied against ×⌿p↓ff cells of the other argument. Prefix agreement is implemented in J [Hui and Iverson 2004], and is consistent with the emphasis on the leading axis (§2).
    • suffix agreement: one frame must be a suffix of the other. J had suffix agreement before it switched to prefix agreement in 1992 on a suggestion by Whitney [Whitney 1992].
    • strict agreement: the frames must match. No dialect has ever implemented this.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). One of the HOPL IV badges has an APL expression on it: ÷+/÷(e≠0)/e, the reciprocal of the sum of the reciprocals of the non-zero values of e. The expression computes the total resistance of components connected in parallel, whose resistance values are the vector e.
    There is an alternative phrasing in modern APL: +⌿⍢÷e~0, sum under reciprocal (§3.5), without 0s. If arithmetic were extended to infinity (§4.6), in particular if ÷0 ↔ ∞ and ÷∞ ↔ 0, then the expression would simplify to +⌿⍢÷e, without the without 0 (~0).
     
  • Kenneth E. Iverson, Peter K. Wooster. A Function Definition Operator. APL Quote Quad, Volume 12, Number 1, Proceedings of APL81, ACM. September 1981 [2022-06-29]. (原始内容存档于2022-06-29). This paper proposes two related extensions to APL: the extension of assignment to allow a name F to be assigned to a derived function by an expression of the form F←+.x, and the introduction of a dyadic operator to apply to character arrays D and M so that D∇M produces an ambivalent function in which the dyadic case is defined by D and the monadic case by M. 
    Kenneth E. Iverson. Rationalized APL. 1983 [2022-06-19]. (原始内容存档于2022-07-22). The proposed replacement for ⎕fx is a modification of the direct definition operator defined in [A Function Definition Operator], ……
    A function produced by the operator may be assigned a name (as in f←m∇d or in a(f←m∇d)b), but it may also be used without assigning a name, as in y←''∇'⍺+÷⍵'/x.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Well, we don’t know what Ken Iverson’s favorite APL expression was or if he even had a favorite APL expression. But we can guess. From A History of APL in 50 Functions [Hui 2016a, §8]:
        ⊢ x←,1
           1
        ⊢ x←(0,x)+(x,0)
           1 1
        ⊢ x←(0,x)+(x,0)
           1 2 1
        ⊢ x←(0,x)+(x,0)
           1 3 3 1
    The expression (0,x)+(x,0) or its commute, which generates the next set of binomial coefficients, …….
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). What is being indexed is an array (of course) but the indices themselves (the “subscripts”) can also be arrays. For example [Hui 2016a, §4]:
        x← 3 1 4 1 5 9
        '.⎕'[x∘.>⍳⌈⌿x]
    ……
    In the example, the 2-element character vector '.⎕' is indexed by a 6-by-9 Boolean matrix.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020. Quicksort works by choosing a “pivot” at random among the major cells, then catenating the sorted major cells which strictly precede the pivot, the major cells equal to the pivot, and the sorted major cells which strictly follow the pivot, as determined by a comparison function ⍺⍺. Defined as an operator Q:
       Q←{1≥≢⍵:⍵ ⋄ s←⍵ ⍺⍺ ⍵⌷⍨?≢⍵ ⋄ (∇ ⍵⌿⍨0>s)⍪(⍵⌿⍨0=s)⍪(∇ ⍵⌿⍨0<s)}
    ……
    The above formulation is not new; see for example Figure 3.7 of the classic The Design and Analysis of Computer Algorithms [Aho et al. 1974]. However, unlike the pidgin ALGOL program in Figure 3.7, Q is executable, and the partial order used in the sorting is an operand, the (×-) and cmp¨ and cmp⍤1 in the examples above.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Monadic was originally defined only on numeric vectors, and was extended [Wooster 1980] to work on numeric arrays with higher rank. With that extension it has the distinction of being the first APL primitive function defined to work on major cells, before the term was invented or the importance of the concept realized. It was later extended to work on character arrays in Dyalog APL in 1982. More recently, was extended in J to work with a TAO (total array ordering) [Hui 1996] on a suggestion by Whitney. TAO was taken up by Dyalog APL in 2018 [Brudzewsky et al. 2018]. The TAO also extends the left domain of . (The expression above for getting grade from sort requires TAO.) 
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020. Generate the sorted matrix of all permutations of ⍳⍵[Hui 2016a, §19; McDonnell 2003; Hui 2015b]. …… perm obtains by indexing each row of the matrix ⍒⍤1 ∘.=⍨ ⍳⍵ by 0,1+perm ⍵-1. …… Putting it all together:
        perm ← {0=⍵:1 0⍴0 ⋄ ((!⍵),⍵)⍴(⊂0,1+∇ ¯1+⍵)⌷⍤1 ⍒⍤1 ∘.=⍨ ⍳⍵}
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020. An example of John Conway’s Game of Life [Gardner 1970] is obligatory with this operator. life below is due to Jay Foad, translated from an algorithm in k by Whitney [Hui 2017c]. It applies the rules of the Game of Life to the universe to create the next generation.
        life ← {3=s-⍵∧4=s←{+⌿,⍵}⌺3 3⊢⍵}
        ⊢ glider←5 5⍴0 0 1 0 0 1 0 1 0 0 0 1 1,12⍴0
    ……
        {'.⍟'[⍵]}¨ (⍳8) {life⍣⍺⊢⍵}¨ ⊂glider
    ……
    In life, the derived function {+⌿,⍵}⌺3 3 computes the sum of each 3-by-3 square, moving by 1 in each dimension. The function {'.⍟'[⍵]} produces a compact display for a Boolean array.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Key is a monadic operator. In the dyadic case of the derived function ⍺ f⌸ ⍵, major cells of specify keys for the corresponding major cells of , and f is applied to each unique key in and the selection of cells in having that key. In the monadic case of the derived function, f⌸⍵ ↔ ⍵ f⌸ ⍳≢⍵: f is applied to each unique key in and the indices in of that key.
    Key was defined and implemented in J in 1989 or 1990 [Hui 2007] and in Dyalog APL in 2015 [Dyalog 2015; Hui 2020b]. It is motivated by the “generalized beta” operation in The Connection Machine [Hillis 1985, §2.6], but generalizes the generalized beta by accepting arrays of any rank, not just vectors, and by permitting any function, not just reductions (folds). Key is also cognate with the GROUP BY statement in SQL. ……
    The following snippet solves a “Programming Pearls” puzzle [Bentley 1983]: given a dictionary of English words, here represented as the character matrix a, find all sets of anagrams. ……he algorithm works by sorting the rows individually (note the use of the rank operator (§3.1)), and these sorted rows are used as keys (“signatures” in the Programming Pearls description) to group the rows of the matrix. As the anagram example illustrates, other APL functions can be used to create the requisite keys.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020. Generate random numbers selected from ⍳≢⍺ according to the weights , a vector of positive real numbers [Hui 2017d]. For example, if a←7 5 6 4 7 2 0.4 are the weights, then in a ran 1e6 the number 0 should occur roughly as often as 4(both with a weight of 7) and 3.5 times as often as 5(with a weight of 2).
        ran ← {(0⍪+⍀⍺÷+⌿⍺)⍸?⍵⍴0}
    ……
    The technique can be used to generate random numbers according to a probability distribution [Abramowitz and Stegun 1964, §26.8]. If a discrete distribution with values v and probabilities p, then v[p ran ⍵]. If a continuous distribution, convert it into a discrete one by dividing (¯∞,∞) into an appropriate number of intervals. The interval midpoints are the values; the probabilities are the differences of the cumulative distribution function at the interval end points.
    The problem was solved in 1975 [IPSA 1975]; the current solution uses to advantage the extension of ?0 to generate a random number drawn uniformly from the open interval (0, 1) (suggested by Whitney) and the interval index function (§2.3).
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020. The following is an example of interval index (§2.3) and working together to illustrate the central limit theorem, that the sum of independent random variables converges to the normal distribution [Hui and Iverson 2004; Hui 2016b, §F].
        t←¯1+{≢⍵}⌸(⍳51),(4×⍳50)⍸+⌿?10 1e6⍴21
    ……
    t counts the number of occurrences for interval endpoints 4×⍳50, of 1e6 samples from the sum of ten repetitions of uniform random selection of the integers from 0 to 20. A barchart of t:
        .⎕'[(6e3×⊖⍳⌈(⌈/t)÷6e3)∘.≤t]
    ……
    The derived function {≢⍵}⌸x counts the number of occurrences of each unique cell of x. The Dyalog APL and J implementations recognize particular useful operands for key, for example {≢⍵} and {f⌿⍵}, and implement those cases with special code (§9.3) for better performance.
     

aplwiki.com

bitsavers.org

  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). For vectors R and X, the decode(or base-value) function R⊥X yields the value of the vector X evaluated in number system with radices R[1],R[2],...,R[⍴R]. ……
    Scalar(or one-element vector) arguments are extended to conform, as required. ……
    the decode function is extended to arrays in the manner of the inner product: each of the radix vectors along the last axis of the first argument is applied to each of the vectors along the first axis of the second argument.
     
    J语言的#.并未继承IBM对APL解码函数的扩展规定,它可以实现为:
       decode=: {{x #."(1 _) (0|: y)}}
    
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). APL functions apply to collections of individual items called arrays. Arrays range from scalars, which are dimensionless, to multi-dimensional arrays of arbitrary rank and size. 
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). For example, the grade function is commonly used to produce indices needed to reorder a vector into ascending order (as in X[⍋X]), but may also be used in the treatment of permutations as the inverse function, that is, ⍋P yields the permutations as the inverse to P. 
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). If P and Q are vectors of the same shape, then the expression +/P×Q has a variety of useful interpretations. ……
    The inner product produces functions equivalent to expressions in this form; it is denoted by a dot and applies the two function surround it. Thus P+.×Q is equivalent to +/P×Q, and P×.⋆Q is equivalent to ×/P⋆Q, and, in general, Pf.gQ is equivalent to f/PgQ, if P and Q are vectors.
    The inner product is extended to arrays other than vectors along certain fixed axes, namely the last axis of the first argument and the first axis of the last argument. the lengths of these axes must agree. the shape of the result is obtained by deleting these axes and chaining the remaining shape vectors together. ……
    The inner product M+.×N is commonly called the matrix product. ……
    Either argument of the inner product may be a scalar or a one-element vectors; it is extended in the usual manner.
     
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). The outer product operator, denoted by by the symbols ∘. preceding the function symbol, applies to any dyadic primitive scalar function, so that the function is evaluated for each member of the left argument paired with each member of the right argument. ……
    Such tables may be better understood if labelled in a way widely used in elementary arithmetic texts: values of the arguments are placed beside and above the table, and the function whose outer product is being computed is shown at the corner.
     
  • A. D. Falkoff英语Adin Falkoff, K. E. Iverson. APL\360 User's Manual (PDF). IBM. August 1968 [2022-07-09]. (原始内容存档 (PDF)于2021-10-27). 
    Table 3.9 shows the detailed definitions of transposition for a variety of cases. ……
    Case ⍴R Definition
    R←1⍉V ⍴V R←V
    R←1 2⍉M ⍴M R←M
    R←2 1⍉M (⍴M)[2 1] R[I;J]←M[J;I]
    R←1 1⍉M ⌊/⍴M R[I]←M[I;I]
    R←1 2 3⍉T ⍴T R←T
    R←1 3 2⍉T (⍴T)[1 3 2] R[I;J;K]←T[I;K,J]
    R←2 3 1⍉T (⍴T)[3 1 2] R[I;J;K]←T[J;K;I]
    R←3 1 2⍉T (⍴T)[2 3 1] R[I;J;K]←T[K;I;J]
    R←1 1 2⍉T (⌊/(⍴T)[1 2]),(⍴T)[3] R[I;J]←T[I;I;J]
    R←1 2 1⍉T (⌊/(⍴T)[1 3]),(⍴T)[2] R[I;J]←T[I;J;I]
    R←2 1 1⍉T (⌊/(⍴T)[2 3]),(⍴T)[1] R[I;J]←T[J;I;I]
    R←1 1 1⍉T ⌊/⍴T R[I]←T[I;I;I]
    Table 3.9: TRANSPOSITION
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). If P is any permutation of the indices of the axes of an array A, then P⍉A is an array similar to A except that the axes are permuted: the Ith axis becomes the P[I]th axis of the result. Hence, if R←P⍉A, then (⍴R)[P] is equal to ⍴A. For example:
          A←2 3 5 7⍴⍳210
          ⍴A
    2 3 5 7
          P←2 3 4 1
          ⍴P⍉A
    7 2 3 5
    ……
    The monadic transpose ⍉A reverses the order of the axes of its argument. Formally, ⍉A is equivalent to (⌽⍳⍴⍴A)⍉A.
     
    上面的APL转置运算规定中,不将多个轴映射到结果中的一个轴的简单示例,所对应的J语言代码:
       transpose=: {{(/: x) |: y}}
       a=: >:i. 2 3 5 7 
       $ a
    2 3 5 7
       p=: 2 3 4 1 
       $ p transpose a
    7 2 3 5
    
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). More generally, Q⍉A is a valid expression if Q is any vector equal in length to the rank of A which is "complete" in the sense that if its items include any integer N they also include all positive integers less then N. For example, if ⍴⍴A is 3, then 1 1 2 and 2 1 1 and 1 1 1 are suitable values for Q but 1 3 1 is not. Just as for the case P⍉A where P is a permutation, the Ith axis becomes the Q[I]th axis of Q⍉A. However, in this case two or more of the axes of A may map into a single axis of the result, thus producing a diagonal section of A as illustrated below:
    ……
          B←3 5⍴⍳15
          B
     1  2  3  4  5
     6  7  8  9 10
    11 12 13 14 15
          1 1⍉B
    1 7 13
     

dyalog.com

dyalog.com

  • John Scholes英语John M. Scholes. Direct Functions in Dyalog APL (PDF). October 1996 [2022-06-30]. (原始内容存档 (PDF)于2021-10-05). A Direct Function (dfn) is a new function definition style, which bridges the gap between named function expressions such as rank←⍴∘⍴ and APL’s traditional ‘header’ style definition. 
    System/ReleaseNotes/J902. 14 May 2020 [2022-06-30]. (原始内容存档于2022-07-03). Explicit entities can be defined using direct definition. The digraphs {{ and }} are reserved for delimiters, and text found between {{ }} is taken to define a verb/adverb/conjunction. The text may be multiple lines long and may contain other embedded definitions. The part of speech of the defined entity is inferred from the words in it. 
  • Stencil Lives. Jay Foad offers another stencil life, translating an algorithm in k by Arthur Whitney:
        life3 ← {3=s-⍵∧4=s←{+/,⍵}⌺3 3⊢⍵} ⍝ Jay Foad
    ……
    The algorithm combines the life rules into a single expression, wherein s←{+/,⍵}⌺3 3 ⊢⍵
    (0) for 0-cells s is the number of neighbors; and
    (1) for 1-cells s is the number of neighbors plus 1, and the plus 1 only matters if s is 4.
     

forums.dyalog.com

  • Roger Hui. dyadic transpose, a personal history. 22 May 2020 [2022-08-08]. (原始内容存档于2022-08-08). Dyadic transpose, x⍉y, is probably one of the last primitives to be mastered for an APLer, but is actually straightforward to describe. 

github.com

gmane.org

thread.gmane.org

  • Eric Iverson. J Source GPL. J programming mailing list. 1 March 2011 [2020-05-18]. (原始内容存档于2016-09-23). 

jsoftware.com

jsoftware.com

  • Roger K.W. Hui, Kenneth E. Iverson, E. E. McDonnell英语Eugene McDonnell, Arthur T. Whitney. APL\?. 1990 [2022-06-12]. (原始内容存档于2022-06-14). This paper describes a version of APL based upon the dictionary, but significantly simplified and enhanced, and directly usable on any machine that provides ASCII characters. It also describes salient features of a C implementation that has been tested on several machines, and is available as freeware. 
  • K. E. Iverson. A Personal View of APL. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Roger and I then began a collaboration on the design and implementation of a dialect of APL (later named J by Roger), first deciding to roughly follow “A Dictionary of APL” and to impose no requirement of compatibility with any existing dialect. We were assisted by suggestions from many sources, particularly in the design of the spelling scheme (E.B. Iverson and A.T. Whitney) and in the treatment of cells, items, and formatting (A.T. Whitney, based on his work on SHARP/HP and on the dialect A reported at the APL89 conference in New York). 
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12). A dictionary should not be read as an introduction to a language, but should rather be consulted in conjunction with other material that uses the language in some context of interest to the reader. Even the general section on grammar, which may be intelligible even to the beginner, should perhaps be studied only after a certain amount of other exposure to the language.
    On the other hand, a dictionary should not be used only to find the meanings of individual words, but should also be studied to gain an overall view of the language. In particular, the grammar may be profitably reviewed again and again in the light of increased knowledge of the language, and the study of groups of related verbs and adverbs can reveal important relationships otherwise easily overlooked.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). Nuclear Axis Operators - The nuax operator (denoted by ) applies to a function left argument and a variable right argument to specify the axes which define the nuclei to which the function is to apply. ……The coax operator is also provided; its argument specifies the axes complementary to the nuclear axes. 
    Kenneth E. Iverson. Rationalized APL. 1983 [2022-06-19]. (原始内容存档于2022-07-22). In conventional APL, the scalar functions (which apply to scalar elements and produce scalar results) extend to higher rank arrays according to simple general rules; no corresponding general rules exist for the remaining so-called mixed functions. ……
    Function rank is the most important notion needed to provide a simple and systematic basis for the uniform treatment of all “mixed” or non-scalar functions. ……
    If f has rank r, then f⍵ is determined by applying f to each of the “cells” of shape (-r)↑⍴⍵, producing a common shape s for each, and assembling the whole into a result of shape ((-r)↓⍴⍵),s. ……
    If the function g←f⍤r is to be applied dyadically as well as monadically (the only cases addressed in the preceding sections), then it is necessary that r specify three independent ranks, the monadic, the left, and the right. The general argument r is therefore a three-element vector that specifies the ranks in the order just indicated. Moreover, r is extended by reshape if necessary, so that f⍤r ←→ f⍤(⌽3⍴⌽r).
     
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). In combinatory logic one of the most useful primitive combinators is designated by S [Sch24]. Curry defines Sfgx in prefix notation to be fx(gx) [CuFeCr74]. In common mathematical infix notation this would be given by (x)f(g(x)), which one can write in APL as xfgx, and this is the hook form (fg)x. The combinatory logician appreciates this form because of its great expressiveness: it can be shown that S, along with K, the constancy combinator, suffice to define all other combinators of interest [Ro50]. (The constancy combinator K is defined in infix notation so that cKx has the value c for all x.) Users of APL will appreciate the hook for the same reasons. 
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). Curry [Cu31] defines a formalizing combinator, Φ, in prefix notation, such that Φfghx means f(gx)(hx). In common mathematical infix notation this would be designated by (g(x))f(h(x)). An example of this form is Φ+sin2cos2θ, meaning sin2θ+cos2θ. The fork (f g h)⍵ has the same meaning, namely (f⍵)g(h⍵). Curry named this the formalizing combinator because of its role in defining formal implication in terms of ordinary implication.
    Iverson and Whitney have made several earlier suggestions of ways to achieve what the fork form provides: the scalar operators of [Iv78], [Iv79a], [Iv 79b], the til operator of [Iv82], the union and intersection conjunctions of [Iv87], and the yoke adverb of [Iv88]. Benkard [Bk87] has also suggested a way to achieve the meaning of this form, in his proposal for ↑g/(f h)⍺ ⍵, using the notion of function pair ( is APL2’s first function). The present proposal has significant advantages over these earlier ones.
     
  • Roger K.W. Hui, Kenneth E. Iverson, Eugene E. McDonnell英语Eugene McDonnell. Tacit Definition. 1991 [2022-06-11]. (原始内容存档于2022-07-06). To appreciate the more general use of tacit definition, it is necessary to understand three key notions of J: cells and rank, forks, and composition.……
    The conjunction & is called with, and applies to nouns (variables) a and b as well as to verbs f and g as follows:
      a&g y is a g y
      f&b y is x f y
      f&g y is f g y
    x f&g y is (g x) f (g y)
    ……
    A number of other constructs in J similarly enhance the utility of tacit definitions. The more important are the under (or dual), atop (a second form of composition), the power conjunction ^:, and further forms of partitions.
     
    Jsoftware. Changes in Version 3.2, 1991 06 02. 1991 [2022-11-07]. (原始内容存档于2022-06-14).
    @.    agenda
    @:    at
    &:    appose
     
  • Robert Bernecky英语Robert Bernecky, Roger K. W. Hui. Gerunds and representations. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Gerunds, verbal forms that can be used as nouns, are recognized as having utility in the realm of programming languages. We show that gerunds can be viewed as arrays of atomic repmentations of verbs (functions), in a way which is consistent with the syntax and semantics of APL, and which allows verbs to be first class objects in the language. We define derivations of verbs from gerunds in the J dialect of APL, and show how these derivations provide control structures for sequencing, selection (in the sense of generalized forms of CASE or SWITCH statements and IF/THEN/ELSE), iteration (DO UNTIL), recursion, and parallel computation (MIMD, or Multiple Instruction, Multiple Data). We conclude with alternative representations of verbs which are useful in other contexts. 
    Jsoftware. Changes in Version 4.0, 1991 11 23. 1991 [2022-06-12]. (原始内容存档于2022-06-14).
    `:1    replaced by u^:v
    `:4    replaced by m~
    `:5    replaced by @.
     
  • Kenneth E. Iverson. Rationalized APL. 1983. The enclose function as defined in [Operators and Enclosed Arrays] has made it possible to produce by straightforward APL functions the “index lists” required in indexing expressions of the form a[i;j], and therefore makes it possible to define a corresponding indexing function, which will be denoted by { and called from:
        i{a ←→ a[>i[0];>i[1]; ...]
    Since the disclose function > is permissive, the selection of any single element of a can be written without enclosures as, for example, 1 2 3{a3. Moreover, the left rank of { is 1 and its right rank is infinite, so that …… a simple left argument i of rank greater than 1 produces an array of shape ¯1↓⍴i of elements chosen by the index vectors along its last axis, yielding what is sometimes called “scattered” indexing. For examp1e:
        (3 2⍴⍳6){a2 ←→ a2[0;1],a2[2;3],a2[4;5]
    ……
    In forming the left arguments of the indexing function, it will often be convenient to use the link function defined as follows:
         ⊃b ←→ <b if b is simple
                b if b is non-simple
        a⊃b ←→ (<a),⊃b
    For example, (2 3⊃4⊃∘⊃5 6){a4 ←→ a[2 3;4;;5 6].
    The indexing function { as defined thus far provides all of the facilities provided by conventional indexing, and “scattered” and “complementary” indexing as well. Its power is further enhanced by allowing negative indexing …….
     
    Roger Hui. Some Uses of { and }. 1987. Dyadic { encompasses all computations expressible by [;] indexing of APL\360, as well as the new negative indexing and complementary indexing. 
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). We also introduce a form of indexing called from denoted by , ……. The basic definition is:
          i⌷a ↔ (,a)[⍉(⍴a)⊥⍉i]
    The function distributes over any scalar function; thus, i⌷a+b ↔ (i⌷a)+(i⌷b). …… For example:
          m←3 4⍴⍳12
          m
    0 1  2  3
    4 5  6  7
    8 9 10 11
          2 2 ⌷ m
    10
    ……
          (3 2⍴3|⍳6)⌷m
    1 8 6
     
    J语言在定义上述的(from)之时,解码前后不需要专门进行一元转置运算:
       from=: {{(($ y) #. x) {::"(0 _) (, y)}}
       ]m=: 3 4$i.12
    0 1  2  3
    4 5  6  7
    8 9 10 11
       2 2 from m
    10
       3 2$3|i.6
    0 1
    2 0
    1 2
       (3 2$3|i.6)from m
    1 8 6
    
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The enclose function (denoted by <) produces a scalar representation of its argument in the sense that the result is of rank zero, and that there exists an inverse function (called disclose, and denoted by >) such that a ↔ ><a for all a. Any result producible by an expression which does not employ the enclose function is called a simple array, or is said to be simple.
    Selection and reshaping functions apply without change to non-simple arrays. However, non-simple arrays are outside the domain of all other functions except for enclose, disclose, and equality (together with those functions such as and which are defined in terms of equality).
    The equality function is extended to non-simple scalar arguments as follows:
        1. (<a)≠a for all a
        2. If a equals b(in rank, shape, and all elements), then (<a)=(<b) yields 1
    ……
    The disclose function is scalar in the sense that it applies to each element of its argument, the new axes disclosed becoming the final axes of the result. ……
    The disclose function applied to a simple array a produces a result identical to a. Thus (<a)=<>a is a test for whether a is simple.
     
  • Kenneth E. Iverson. Rationalized APL. 1983. APL2 provides two significant facilities which apply at “depth” in the enclosure structure of an argument, the dyadic pick function, and the pervasive functions. RS provides no primitive corresponding to pick; it could be defined recursively by:
        pick←''∇('→2+0=⍴⍺'⊃'(>0{⍺){(1↓⍺)∆⍵'⊃'⍵')
    ……
    Since pervasiveness is a property assigned to functions, it would, in the framework of RS, be provided by an operator. Such an operator could be applied to any function (defined or derived as well as primitive) and, if defined to be dyadic, could provide greater variety. ……
    If each essential space in an expression is counted as a character, then the link function and strand notation used to form non-simple vectors from simple vectors require expressions of nearly identical length. ……
    RS does not include the heterogeneous arrays of APL2, and the production of equivalent constructs requires greater use of enclosure. However, the structure of RS does not preclude their introduction. ……
    The monadic enclose functions defined in RS (<) and in APL2 () differ in one respect: if s is a simple scalar, then s≡⊂s, but ~s≡<s. Although < can therefore produce some structures not producible by , the differences between them (in the contexts of the respective systems) cannot, in most cases, be discerned.
     
  • Chris Burke. J4 and OOP. 1998 [2022-11-08]. (原始内容存档于2022-11-08). 
    Roger Stokes. Chapter 25: Object-Oriented Programming. 2015 [2020-05-18]. (原始内容存档于2020-06-25). 
  • Jsoftware's sourcing policy. [2020-05-18]. (原始内容存档于2021-01-26). 
  • Roger K.W. Hui. Extended Integers in J. 1996 [2022-06-24]. (原始内容存档于2022-06-28). Some verbs v signal domain error on some extended arguments because the result is not integral; however, <.@v and >.@v are closed on extended arguments. 
  • K.E. Iverson. Determinant-Like Functions Produced by the Dot Operator. 1982. The operator denoted by the dot has been extended to provide a monadic function (as in -.×m) as well as the established dyadic inner product function (as in n+.×m). ……
    The determinant of a square matrix m is defined as the alternating sum (i.e. reduction by -) of the !n←1↑⍴m products over n elements chosen (in each of the !n possible ways) one from each row and column. Analogous calculations in which other function pairs are substituted for - and × lead to other useful functions; examples include the pairs ⌈⌊, ∧∨, and , the last (called the permanent) being useful in combinatorics.
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987. The case 3⍤v also has left rank 2 , and ⍺3⍤v⍵ applies v to each element produced by a tessellation of , using a size 1{⍺, and beginning points that are multiples of the “shift” 0{⍺. 
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The dual operator, denoted by , is a slight extension of the notion of dual functions implicit in deMorgan’s law (∨⍢~ ↔ ^ and ≠⍢~ ↔ =), the extension being to include a monadic left argument, as in ⌊⍢-x ↔ ⌈x. ……
    Composition and the dual operator applied to a divalent left argument and a monadic (or divalent) right argument yield parallel definitions of divalent derived functions as follows:
    ……
    Dual:  f⍢g y ↔ (g⍣¯1) f (g y)
        x f⍢g y ↔ (g⍣¯1) (g x) f (g y)
    It should be noted that the extension of the dual to include the monadic definition makes the identities ⌈⍢- ↔ ⌊ and ⌊⍢- ↔ ⌈ hold for both the monadic case (floor and ceiling) and for the dyadic case (minimum and maximum). Moreover, for the dyadic case the exponential function yields the identities ×⍢* ↔ + and +⍢⍟ ↔ ×, the latter of which provides the basis for the use of natural logarithms in multiplication, just as the identity +⍢(10¨⍟) ↔ x forms the basis for the use of base ten logarithms.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The expression f⍢> produces a derived function which applies the function f to its argument in an “item-wise” fashion, by disclosing each element of the argument, applying f, and enclosing the result to produce the corresponding element of the overall result. 
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u⍥v    Rank: mv lv rv    Upon; Upon
    The monad u is applied to the result of v, that is:
      u⍥v ⍵ ←→ u v ⍵ ←→ u⍤v ⍵
    ⍺ u⍥v ⍵ ←→ u ⍺ v ⍵
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u⍤v    Rank: mv mv mv    On; On
    Monad. In the simplest case u⍤v ⍵ is equivalent to u v ⍵. …… more generally, the rank of the derived function u⍤v is the rank of v; that is, the expression u v is applied to each of the cells of relative to v. ……
    Dyad. The left and right ranks of u⍤v are both the monadic rank of v. Therefore ⍺ u⍤v ⍵ is equivalent to (v⍺) u v ⍵.
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12). Withe (u⍩v) is similar to (u⍤v), but applies v only to the right argument:
    ⍺ u⍩v ⍵ ←→ ⍺ u v ⍵
      u⍩v ⍵ ←→ ⍵ u v ⍵
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u¨v    Rank: mv mv mv    Under; Under
    This function is equivalent to composition (u⍤v) except that the function inverse to v is applied to the result of each cell. …… The function u¨v is often called “the dual of u with respect to v”, but the phrase “u under v” is probably better, suggesting that u is performed after preparatory work by v, and before the task is sewn up by reversing the effect of v. The expression u¨v is valid only if v possesses an inverse.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The power operator, denoted by , applies to a monadic function left argument f and an integer right argument k to produce the kth power of f in the following sense: f⍣k ↔ f f⍣k-1, and f⍣1 ↔ f. In particular, f⍣0 is the identity function and f⍣¯1 is the inverse of f. Moreover, f⍣_ denotes the limit of f, that is, the limiting function f⍣n for n large. Similarly, f⍣¯ denotes the limit of the inverse of f. 
  • Kenneth E. Iverson, Peter K. Wooster. A Function Definition Operator. APL Quote Quad, Volume 12, Number 1, Proceedings of APL81, ACM. September 1981 [2022-06-29]. (原始内容存档于2022-06-29). This paper proposes two related extensions to APL: the extension of assignment to allow a name F to be assigned to a derived function by an expression of the form F←+.x, and the introduction of a dyadic operator to apply to character arrays D and M so that D∇M produces an ambivalent function in which the dyadic case is defined by D and the monadic case by M. 
    Kenneth E. Iverson. Rationalized APL. 1983 [2022-06-19]. (原始内容存档于2022-07-22). The proposed replacement for ⎕fx is a modification of the direct definition operator defined in [A Function Definition Operator], ……
    A function produced by the operator may be assigned a name (as in f←m∇d or in a(f←m∇d)b), but it may also be used without assigning a name, as in y←''∇'⍺+÷⍵'/x.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The use of the indexing function will be illustrated in a proof of the useful identity i⍉j⍉a ↔ i[j]⍉a. We first state the definition of the transpose as follows: if k is any vector index of j⍉a then
          k⌷j⍉a ↔ k[j]⌷a
    Then:
          k⌷i⍉j⍉a
          k[i]⌷j⍉a
          (k[i])[j]⌷a
          k[i[j]]⌷a
          k⌷i[j]⍉a
     
    Kenneth E. Iverson的上述二元转置定义,用J语言写为(<k){j|:a(<(/:j){k){a,而恒等式i|:j|:a(i{j)|:a的推导过程相应如下:
       (<k){i|:j|:a
       (<(/:i){k){j|:a 
       (<(/:j){(/:i){k){a
       (<k){(/:(/:j){(/:i))|:a
       (<k){(i{j)|:a
    
  • A History of APL in 50 Functions - 19. Permutations. [2022-09-27]. (原始内容存档于2022-09-27). 

code.jsoftware.com

keiapl.org

  • Roger Hui. Remembering Ken Iverson. 2004 [2022-11-05]. (原始内容存档于2019-12-20). Ken and I had in mind to implement A Dictionary of APL [8] together with hooks and forks (phrasal forms) [20]. ……
    The choice to implement forks was fortuitous and fortunate. We realized only later [32] that forks made tacit expressions (operator expressions) complete in the following sense: any sentence involving one or two arguments that did not use its arguments as an argument to an operator, can be written tacitly with fork and @:(compose) and [(left) and ](right) and constant functions. If @: were replaced by the equivalent special fork [: f g, then a sentence can be written as an unbroken train (sequence of forks). ……
    Meanwhile, Ken was concerned about the usefulness of forks, and worked hard at finding examples of forks beyond those in Phrasal Forms [20]. After a while, it seemed that everything was a fork. The explanation lies in the proof of completeness for tacit definition [32]: if the root (last) function in a sentence is applied dyadically, then a fork is required to write the sentence tacitly.
     

netlib.org

sccode.org

doc.sccode.org

sigapl.org

softwarepreservation.org

  • James A. Brown英语Jim Brown (computer scientist). The Principles of APL2. TR 03.247. IBM Santa Teresa Laboratory, San Jose, California. 1984 [2022-06-23]. (原始内容存档于2022-06-12). APL2 is based on this writer' s PhD Thesis [Br1], the array theory of Trenchard More [Mo1] and most of all on APL1. ……
    The arrays of APL2 are finite rectangular arrays which contain arrays as items. When the term array is used, it means this subset of all possible arrays.
    The arrays of APL2 are the same as the arrays of Array Theory and in particular empty arrays have structure as defined by Array Theory [Mo1 etc.].
    An array one of whose items is other than a single number or character (a simple scalar) is called a nested array. An array containing only numbers or containing only characters is called a homogeneous array. An array all of whose items are either single numbers or single characters is called a simple array. The arrays of APL1 are simple and homogeneous.
    In some sense every array in APL2 is nested because it contains other arrays. The term is reserved for those which contain at least one item which is not a single number or character. Thus the universe of arrays is partitioned into two subsets: simple arrays and nested arrays. ……
    A function is pervasive if pick distributes over it. ……
    Since the pick function may select an item at an arbitrary depth in a nested array, it may select deep enough to access a simple scalar (because nested arrays have finite depth). Thus a pervasive function may be thought of as applying independently to each simple scalar in its argument(s). ……
    In APL2 the scalar functions and only the scalar functions are pervasive.
     

web.archive.org

  • Roger K.W. Hui, Kenneth E. Iverson, E. E. McDonnell英语Eugene McDonnell, Arthur T. Whitney. APL\?. 1990 [2022-06-12]. (原始内容存档于2022-06-14). This paper describes a version of APL based upon the dictionary, but significantly simplified and enhanced, and directly usable on any machine that provides ASCII characters. It also describes salient features of a C implementation that has been tested on several machines, and is available as freeware. 
  • SuperCollider documentation, Adverbs for Binary Operators. [2020-04-18]. (原始内容存档于2020-12-11). 
  • Release Notes J9.4. [2023-03-25]. (原始内容存档于2023-05-08). 
  • K. E. Iverson. A Personal View of APL. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Roger and I then began a collaboration on the design and implementation of a dialect of APL (later named J by Roger), first deciding to roughly follow “A Dictionary of APL” and to impose no requirement of compatibility with any existing dialect. We were assisted by suggestions from many sources, particularly in the design of the spelling scheme (E.B. Iverson and A.T. Whitney) and in the treatment of cells, items, and formatting (A.T. Whitney, based on his work on SHARP/HP and on the dialect A reported at the APL89 conference in New York). 
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In 1989, Iverson, together with Roger Hui and with input from Arthur Whitney, produced J, with a goal of providing a “shareware” APL implementation for use in teaching. The special APL characters were abandoned because it was felt that they require technical solutions which at that time were still prohibitively expensive in an educational environment. ……
    J was clearly a “rationalization” of SHARP APL. ……
    ACM SIGAPL, the ACM Special Interest Group on APL, reinterpreted the “APL” in its name in early 2009 as Array Programming Languages, so that J, k, Nial, etc. would be included in its purview.
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12). A dictionary should not be read as an introduction to a language, but should rather be consulted in conjunction with other material that uses the language in some context of interest to the reader. Even the general section on grammar, which may be intelligible even to the beginner, should perhaps be studied only after a certain amount of other exposure to the language.
    On the other hand, a dictionary should not be used only to find the meanings of individual words, but should also be studied to gain an overall view of the language. In particular, the grammar may be profitably reviewed again and again in the light of increased knowledge of the language, and the study of groups of related verbs and adverbs can reveal important relationships otherwise easily overlooked.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). Nuclear Axis Operators - The nuax operator (denoted by ) applies to a function left argument and a variable right argument to specify the axes which define the nuclei to which the function is to apply. ……The coax operator is also provided; its argument specifies the axes complementary to the nuclear axes. 
    Kenneth E. Iverson. Rationalized APL. 1983 [2022-06-19]. (原始内容存档于2022-07-22). In conventional APL, the scalar functions (which apply to scalar elements and produce scalar results) extend to higher rank arrays according to simple general rules; no corresponding general rules exist for the remaining so-called mixed functions. ……
    Function rank is the most important notion needed to provide a simple and systematic basis for the uniform treatment of all “mixed” or non-scalar functions. ……
    If f has rank r, then f⍵ is determined by applying f to each of the “cells” of shape (-r)↑⍴⍵, producing a common shape s for each, and assembling the whole into a result of shape ((-r)↓⍴⍵),s. ……
    If the function g←f⍤r is to be applied dyadically as well as monadically (the only cases addressed in the preceding sections), then it is necessary that r specify three independent ranks, the monadic, the left, and the right. The general argument r is therefore a three-element vector that specifies the ranks in the order just indicated. Moreover, r is extended by reshape if necessary, so that f⍤r ←→ f⍤(⌽3⍴⌽r).
     
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). In combinatory logic one of the most useful primitive combinators is designated by S [Sch24]. Curry defines Sfgx in prefix notation to be fx(gx) [CuFeCr74]. In common mathematical infix notation this would be given by (x)f(g(x)), which one can write in APL as xfgx, and this is the hook form (fg)x. The combinatory logician appreciates this form because of its great expressiveness: it can be shown that S, along with K, the constancy combinator, suffice to define all other combinators of interest [Ro50]. (The constancy combinator K is defined in infix notation so that cKx has the value c for all x.) Users of APL will appreciate the hook for the same reasons. 
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). Curry [Cu31] defines a formalizing combinator, Φ, in prefix notation, such that Φfghx means f(gx)(hx). In common mathematical infix notation this would be designated by (g(x))f(h(x)). An example of this form is Φ+sin2cos2θ, meaning sin2θ+cos2θ. The fork (f g h)⍵ has the same meaning, namely (f⍵)g(h⍵). Curry named this the formalizing combinator because of its role in defining formal implication in terms of ordinary implication.
    Iverson and Whitney have made several earlier suggestions of ways to achieve what the fork form provides: the scalar operators of [Iv78], [Iv79a], [Iv 79b], the til operator of [Iv82], the union and intersection conjunctions of [Iv87], and the yoke adverb of [Iv88]. Benkard [Bk87] has also suggested a way to achieve the meaning of this form, in his proposal for ↑g/(f h)⍺ ⍵, using the notion of function pair ( is APL2’s first function). The present proposal has significant advantages over these earlier ones.
     
  • Roger K.W. Hui, Kenneth E. Iverson, Eugene E. McDonnell英语Eugene McDonnell. Tacit Definition. 1991 [2022-06-11]. (原始内容存档于2022-07-06). To appreciate the more general use of tacit definition, it is necessary to understand three key notions of J: cells and rank, forks, and composition.……
    The conjunction & is called with, and applies to nouns (variables) a and b as well as to verbs f and g as follows:
      a&g y is a g y
      f&b y is x f y
      f&g y is f g y
    x f&g y is (g x) f (g y)
    ……
    A number of other constructs in J similarly enhance the utility of tacit definitions. The more important are the under (or dual), atop (a second form of composition), the power conjunction ^:, and further forms of partitions.
     
    Jsoftware. Changes in Version 3.2, 1991 06 02. 1991 [2022-11-07]. (原始内容存档于2022-06-14).
    @.    agenda
    @:    at
    &:    appose
     
  • Robert Bernecky英语Robert Bernecky, Roger K. W. Hui. Gerunds and representations. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Gerunds, verbal forms that can be used as nouns, are recognized as having utility in the realm of programming languages. We show that gerunds can be viewed as arrays of atomic repmentations of verbs (functions), in a way which is consistent with the syntax and semantics of APL, and which allows verbs to be first class objects in the language. We define derivations of verbs from gerunds in the J dialect of APL, and show how these derivations provide control structures for sequencing, selection (in the sense of generalized forms of CASE or SWITCH statements and IF/THEN/ELSE), iteration (DO UNTIL), recursion, and parallel computation (MIMD, or Multiple Instruction, Multiple Data). We conclude with alternative representations of verbs which are useful in other contexts. 
    Jsoftware. Changes in Version 4.0, 1991 11 23. 1991 [2022-06-12]. (原始内容存档于2022-06-14).
    `:1    replaced by u^:v
    `:4    replaced by m~
    `:5    replaced by @.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). For years, Iverson struggled to achieve in APL the effect of f+g and f×g as they are written in calculus. …… Finally, trains AKA forks were invented [Iverson and McDonnell 1989]. ……
    Moreover, (f … h p q r) ↔ (f … h (p q r)), and an isolated sequence of two functions is also assigned a meaning (atop, described below), so that a train of any length, even or odd, is interpreted. ……
    Subsequently, it was realized that trains greatly increase the possibilities for “tacit definition”, expressions consisting of compositions of functions which do not explicitly mention the arguments [Hui et al. 1991]. Trains are implemented in several dialects: J [Hui et al. 1991], NARS2000 [Smith 2020], NGN APL [Nickolov 2013], and Dyalog APL [Scholes 2013]. ……
    The expressive completeness of trains depends on an atop composition of two functions …… Dyalog APL defines 2-trains as atop. That, together with the functions (left) and (right), allows many common compositions to be written as trains.
     
  • Roger Hui earns the Iverson Award. [2022-07-30]. (原始内容存档于2022-07-30). 
  • Vocabulary/Words. [2020-05-18]. (原始内容存档于2016-03-07). 
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). For vectors R and X, the decode(or base-value) function R⊥X yields the value of the vector X evaluated in number system with radices R[1],R[2],...,R[⍴R]. ……
    Scalar(or one-element vector) arguments are extended to conform, as required. ……
    the decode function is extended to arrays in the manner of the inner product: each of the radix vectors along the last axis of the first argument is applied to each of the vectors along the first axis of the second argument.
     
    J语言的#.并未继承IBM对APL解码函数的扩展规定,它可以实现为:
       decode=: {{x #."(1 _) (0|: y)}}
    
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). We also introduce a form of indexing called from denoted by , ……. The basic definition is:
          i⌷a ↔ (,a)[⍉(⍴a)⊥⍉i]
    The function distributes over any scalar function; thus, i⌷a+b ↔ (i⌷a)+(i⌷b). …… For example:
          m←3 4⍴⍳12
          m
    0 1  2  3
    4 5  6  7
    8 9 10 11
          2 2 ⌷ m
    10
    ……
          (3 2⍴3|⍳6)⌷m
    1 8 6
     
    J语言在定义上述的(from)之时,解码前后不需要专门进行一元转置运算:
       from=: {{(($ y) #. x) {::"(0 _) (, y)}}
       ]m=: 3 4$i.12
    0 1  2  3
    4 5  6  7
    8 9 10 11
       2 2 from m
    10
       3 2$3|i.6
    0 1
    2 0
    1 2
       (3 2$3|i.6)from m
    1 8 6
    
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). APL functions apply to collections of individual items called arrays. Arrays range from scalars, which are dimensionless, to multi-dimensional arrays of arbitrary rank and size. 
  • Bob Smith. Nested arrays, operators, and functions. 1981 [2022-06-19]. (原始内容存档于2022-06-20). The data structures of APL are rectangular, multi-dimensional, and flat -- the latter term meaning that all items of arrays are simple scalars. ……
    In general, a system with nested arrays extends the power of APL by being able to represent data of non-zero depth. Also, in keeping with the past, the system includes a set of primitive functions and operators, tailor-made for manipulating these new data structures.
    Continuing the above example, the names of the months of the year are best represented in a 12-item vector whose items are each character vectors. This structure has a depth of one. Note that because the individual names are in separate items, we need no longer resort to artifices like pad characters. Moreover, explicit delimiters are not needed as the separation between items is represented through structure rather than data. This particular representation is called a vector of vectors, and can be created as follows:
        MONTHS ← ('JANUARY') ('FEBRUARY') ...
    The above line also illustrates strand notation, used to enter a nested vector in a simple and convenient manner. ……
    Of the several new operators, the only one specific to nested arrays is the each operator(symbol ¨), which is monadic as an operator, and produces an ambivalent derived function. It is used to apply the f unction which is its argument to the items of an array to produce corresponding items in the result. For example, to determine the length of the names of the months in the above example, use
        ⍴¨MONTHS
    (7) (8) (5) (5) (3) (4) (4) (6) (9) (7) (8) (8)
    Since monadic rho returns a vector , each item of the above result is a vector (specifically in these cases a one-item vector). The parentheses in the display indicate that the item is not a simple scalar.
     
  • James A. Brown英语Jim Brown (computer scientist). The Principles of APL2. TR 03.247. IBM Santa Teresa Laboratory, San Jose, California. 1984 [2022-06-23]. (原始内容存档于2022-06-12). APL2 is based on this writer' s PhD Thesis [Br1], the array theory of Trenchard More [Mo1] and most of all on APL1. ……
    The arrays of APL2 are finite rectangular arrays which contain arrays as items. When the term array is used, it means this subset of all possible arrays.
    The arrays of APL2 are the same as the arrays of Array Theory and in particular empty arrays have structure as defined by Array Theory [Mo1 etc.].
    An array one of whose items is other than a single number or character (a simple scalar) is called a nested array. An array containing only numbers or containing only characters is called a homogeneous array. An array all of whose items are either single numbers or single characters is called a simple array. The arrays of APL1 are simple and homogeneous.
    In some sense every array in APL2 is nested because it contains other arrays. The term is reserved for those which contain at least one item which is not a single number or character. Thus the universe of arrays is partitioned into two subsets: simple arrays and nested arrays. ……
    A function is pervasive if pick distributes over it. ……
    Since the pick function may select an item at an arbitrary depth in a nested array, it may select deep enough to access a simple scalar (because nested arrays have finite depth). Thus a pervasive function may be thought of as applying independently to each simple scalar in its argument(s). ……
    In APL2 the scalar functions and only the scalar functions are pervasive.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The enclose function (denoted by <) produces a scalar representation of its argument in the sense that the result is of rank zero, and that there exists an inverse function (called disclose, and denoted by >) such that a ↔ ><a for all a. Any result producible by an expression which does not employ the enclose function is called a simple array, or is said to be simple.
    Selection and reshaping functions apply without change to non-simple arrays. However, non-simple arrays are outside the domain of all other functions except for enclose, disclose, and equality (together with those functions such as and which are defined in terms of equality).
    The equality function is extended to non-simple scalar arguments as follows:
        1. (<a)≠a for all a
        2. If a equals b(in rank, shape, and all elements), then (<a)=(<b) yields 1
    ……
    The disclose function is scalar in the sense that it applies to each element of its argument, the new axes disclosed becoming the final axes of the result. ……
    The disclose function applied to a simple array a produces a result identical to a. Thus (<a)=<>a is a test for whether a is simple.
     
  • Guides/AVX. [2021-12-20]. (原始内容存档于2021-12-20). 
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In order to provide users with access to APIs and frameworks, APL language designers searched for ways to integrate into APL, where everything is an array, selected aspects of the OO paradigm, where everything is an object. ……
    Some interpreters, like APL+Win, avoided incorporating objects into the APL heap (or “workspace”). ……
    Other systems added features which allowed variables, functions and operators to be organized in dynamic objects in the workspace. The resulting containers are known as namespaces (Dyalog APL) and locales (J). k implements dictionaries, which are also containers for arrays, but are typically used to contain arrays representing the columns of a relational table. …… The same language features which supported namespaces or classes within APL were used to wrap the external objects used by object oriented APIs, or platforms like the Microsoft’s OLE and .NET frameworks.
    The choice of syntax for referring to a member name of an object emp was not straightforward. ……
    Most APL systems did adopt the notation from other OO languages — with a few exceptions.
      emp.name    in most APL systems
      name__emp   in J (retaining right-to-left evaluation)
      emp[`name]  in k (using a symbol within index brackets to select from a dictionary)
    ……
    Although APL interpreters have had extensive support for object oriented programming for nearly two decades, most APL users still feel that object and array paradigms are an awkward fit. …… Many of the benefits of OO are related to taking advantage of types, while much of the strength of the APL family is that you can write code which is shape, rank, and type agnostic — achieving many of the same goals as OO through radically different mechanisms.
     
  • 语境. [2022-09-29]. (原始内容存档于2022-09-29). 
  • Chris Burke. J4 and OOP. 1998 [2022-11-08]. (原始内容存档于2022-11-08). 
    Roger Stokes. Chapter 25: Object-Oriented Programming. 2015 [2020-05-18]. (原始内容存档于2020-06-25). 
  • J9 base library. [2022-10-20]. (原始内容存档于2022-12-19). 
    标准库页面存档备份,存于互联网档案馆
  • 包管理器. [2020-05-22]. (原始内容存档于2021-04-06). 
  • 插件页面存档备份,存于互联网档案馆
  • Run a sentence and produce a 2D display of results. [2022-10-30]. (原始内容存档于2022-10-30). 
    Dissect页面存档备份,存于互联网档案馆
  • Jdatabase (Jd) is a relational database management system (RDBMS) from Jsoftware that is implemented in J. [2022-09-25]. (原始内容存档于2022-12-06). 
  • Eric Iverson. J Source GPL. J programming mailing list. 1 March 2011 [2020-05-18]. (原始内容存档于2016-09-23). 
  • Jsoftware's sourcing policy. [2020-05-18]. (原始内容存档于2021-01-26). 
  • NuVoc页面存档备份,存于互联网档案馆
  • 词类页面存档备份,存于互联网档案馆
  • 名词页面存档备份,存于互联网档案馆
  • 动词页面存档备份,存于互联网档案馆
  • 定语页面存档备份,存于互联网档案馆
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). For example, the grade function is commonly used to produce indices needed to reorder a vector into ascending order (as in X[⍋X]), but may also be used in the treatment of permutations as the inverse function, that is, ⍋P yields the permutations as the inverse to P. 
  • Read and write CSV files and strings. [2022-06-14]. (原始内容存档于2022-07-07). 
    Addons/tables/csv页面存档备份,存于互联网档案馆
  • Roger K.W. Hui. Extended Integers in J. 1996 [2022-06-24]. (原始内容存档于2022-06-28). Some verbs v signal domain error on some extended arguments because the result is not integral; however, <.@v and >.@v are closed on extended arguments. 
  • J Memory Mapped File. [2022-10-20]. (原始内容存档于2022-10-20). 
    内存映射文件页面存档备份,存于互联网档案馆
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). If P and Q are vectors of the same shape, then the expression +/P×Q has a variety of useful interpretations. ……
    The inner product produces functions equivalent to expressions in this form; it is denoted by a dot and applies the two function surround it. Thus P+.×Q is equivalent to +/P×Q, and P×.⋆Q is equivalent to ×/P⋆Q, and, in general, Pf.gQ is equivalent to f/PgQ, if P and Q are vectors.
    The inner product is extended to arrays other than vectors along certain fixed axes, namely the last axis of the first argument and the first axis of the last argument. the lengths of these axes must agree. the shape of the result is obtained by deleting these axes and chaining the remaining shape vectors together. ……
    The inner product M+.×N is commonly called the matrix product. ……
    Either argument of the inner product may be a scalar or a one-element vectors; it is extended in the usual manner.
     
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). The outer product operator, denoted by by the symbols ∘. preceding the function symbol, applies to any dyadic primitive scalar function, so that the function is evaluated for each member of the left argument paired with each member of the right argument. ……
    Such tables may be better understood if labelled in a way widely used in elementary arithmetic texts: values of the arguments are placed beside and above the table, and the function whose outer product is being computed is shown at the corner.
     
  • Vocabulary/SpecialCombinations. [2023-05-08]. (原始内容存档于2023-05-08). 
  • 页面存档备份,存于互联网档案馆
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). In the dyadic case, two frames lf and rf are involved, from the left and right arguments. Several different treatments are possible:
    • scalar agreement: (lf≡rf)∨(lf≡⍬)∨(rf≡⍬), the left and right frames match, or one is the empty vector (). If the frames match, there are an equal number of left and right cells, and the operand function applies to corresponding cells. If they do not match, one frame must be , that is, there is one cell on one side, whence that one cell is applied against every cell on the other side. Scalar agreement is implemented in Dyalog APL [Dyalog 2015].
    • prefix agreement: (p↑lf)≡(p↑rf) ⊣ p←(≢lf)⌊(≢rf), one frame must be a prefix of the other. Let ff be the longer frame (that is, ff←lf,p↓rf). In this case a cell of the argument with the shorter frame is applied against ×⌿p↓ff cells of the other argument. Prefix agreement is implemented in J [Hui and Iverson 2004], and is consistent with the emphasis on the leading axis (§2).
    • suffix agreement: one frame must be a suffix of the other. J had suffix agreement before it switched to prefix agreement in 1992 on a suggestion by Whitney [Whitney 1992].
    • strict agreement: the frames must match. No dialect has ever implemented this.
     
  • 动词信息. [2022-06-04]. (原始内容存档于2022-07-06). 
  • 框架填充. [2022-06-07]. (原始内容存档于2022-07-06). 
  • 定语生成的动词的秩. [2022-06-04]. (原始内容存档于2022-07-07). 
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The dual operator, denoted by , is a slight extension of the notion of dual functions implicit in deMorgan’s law (∨⍢~ ↔ ^ and ≠⍢~ ↔ =), the extension being to include a monadic left argument, as in ⌊⍢-x ↔ ⌈x. ……
    Composition and the dual operator applied to a divalent left argument and a monadic (or divalent) right argument yield parallel definitions of divalent derived functions as follows:
    ……
    Dual:  f⍢g y ↔ (g⍣¯1) f (g y)
        x f⍢g y ↔ (g⍣¯1) (g x) f (g y)
    It should be noted that the extension of the dual to include the monadic definition makes the identities ⌈⍢- ↔ ⌊ and ⌊⍢- ↔ ⌈ hold for both the monadic case (floor and ceiling) and for the dyadic case (minimum and maximum). Moreover, for the dyadic case the exponential function yields the identities ×⍢* ↔ + and +⍢⍟ ↔ ×, the latter of which provides the basis for the use of natural logarithms in multiplication, just as the identity +⍢(10¨⍟) ↔ x forms the basis for the use of base ten logarithms.
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The expression f⍢> produces a derived function which applies the function f to its argument in an “item-wise” fashion, by disclosing each element of the argument, applying f, and enclosing the result to produce the corresponding element of the overall result. 
  • Roger Hui. Remembering Ken Iverson. 2004 [2022-11-05]. (原始内容存档于2019-12-20). Ken and I had in mind to implement A Dictionary of APL [8] together with hooks and forks (phrasal forms) [20]. ……
    The choice to implement forks was fortuitous and fortunate. We realized only later [32] that forks made tacit expressions (operator expressions) complete in the following sense: any sentence involving one or two arguments that did not use its arguments as an argument to an operator, can be written tacitly with fork and @:(compose) and [(left) and ](right) and constant functions. If @: were replaced by the equivalent special fork [: f g, then a sentence can be written as an unbroken train (sequence of forks). ……
    Meanwhile, Ken was concerned about the usefulness of forks, and worked hard at finding examples of forks beyond those in Phrasal Forms [20]. After a while, it seemed that everything was a fork. The explanation lies in the proof of completeness for tacit definition [32]: if the root (last) function in a sentence is applied dyadically, then a fork is required to write the sentence tacitly.
     
  • Function composition. [2022-06-09]. (原始内容存档于2022-07-06). 
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u⍥v    Rank: mv lv rv    Upon; Upon
    The monad u is applied to the result of v, that is:
      u⍥v ⍵ ←→ u v ⍵ ←→ u⍤v ⍵
    ⍺ u⍥v ⍵ ←→ u ⍺ v ⍵
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u⍤v    Rank: mv mv mv    On; On
    Monad. In the simplest case u⍤v ⍵ is equivalent to u v ⍵. …… more generally, the rank of the derived function u⍤v is the rank of v; that is, the expression u v is applied to each of the cells of relative to v. ……
    Dyad. The left and right ranks of u⍤v are both the monadic rank of v. Therefore ⍺ u⍤v ⍵ is equivalent to (v⍺) u v ⍵.
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12). Withe (u⍩v) is similar to (u⍤v), but applies v only to the right argument:
    ⍺ u⍩v ⍵ ←→ ⍺ u v ⍵
      u⍩v ⍵ ←→ ⍵ u v ⍵
     
  • Kenneth E. Iverson. A Dictionary of APL. 1987 [2022-06-08]. (原始内容存档于2022-06-12).
    u¨v    Rank: mv mv mv    Under; Under
    This function is equivalent to composition (u⍤v) except that the function inverse to v is applied to the result of each cell. …… The function u¨v is often called “the dual of u with respect to v”, but the phrase “u under v” is probably better, suggesting that u is performed after preparatory work by v, and before the task is sewn up by reversing the effect of v. The expression u¨v is valid only if v possesses an inverse.
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). One of the HOPL IV badges has an APL expression on it: ÷+/÷(e≠0)/e, the reciprocal of the sum of the reciprocals of the non-zero values of e. The expression computes the total resistance of components connected in parallel, whose resistance values are the vector e.
    There is an alternative phrasing in modern APL: +⌿⍢÷e~0, sum under reciprocal (§3.5), without 0s. If arithmetic were extended to infinity (§4.6), in particular if ÷0 ↔ ∞ and ÷∞ ↔ 0, then the expression would simplify to +⌿⍢÷e, without the without 0 (~0).
     
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The power operator, denoted by , applies to a monadic function left argument f and an integer right argument k to produce the kth power of f in the following sense: f⍣k ↔ f f⍣k-1, and f⍣1 ↔ f. In particular, f⍣0 is the identity function and f⍣¯1 is the inverse of f. Moreover, f⍣_ denotes the limit of f, that is, the limiting function f⍣n for n large. Similarly, f⍣¯ denotes the limit of the inverse of f. 
  • Vocabulary/Inverses. [2022-10-23]. (原始内容存档于2022-12-05). 
  • Kenneth E. Iverson, Peter K. Wooster. A Function Definition Operator. APL Quote Quad, Volume 12, Number 1, Proceedings of APL81, ACM. September 1981 [2022-06-29]. (原始内容存档于2022-06-29). This paper proposes two related extensions to APL: the extension of assignment to allow a name F to be assigned to a derived function by an expression of the form F←+.x, and the introduction of a dyadic operator to apply to character arrays D and M so that D∇M produces an ambivalent function in which the dyadic case is defined by D and the monadic case by M. 
    Kenneth E. Iverson. Rationalized APL. 1983 [2022-06-19]. (原始内容存档于2022-07-22). The proposed replacement for ⎕fx is a modification of the direct definition operator defined in [A Function Definition Operator], ……
    A function produced by the operator may be assigned a name (as in f←m∇d or in a(f←m∇d)b), but it may also be used without assigning a name, as in y←''∇'⍺+÷⍵'/x.
     
  • John Scholes英语John M. Scholes. Direct Functions in Dyalog APL (PDF). October 1996 [2022-06-30]. (原始内容存档 (PDF)于2021-10-05). A Direct Function (dfn) is a new function definition style, which bridges the gap between named function expressions such as rank←⍴∘⍴ and APL’s traditional ‘header’ style definition. 
    System/ReleaseNotes/J902. 14 May 2020 [2022-06-30]. (原始内容存档于2022-07-03). Explicit entities can be defined using direct definition. The digraphs {{ and }} are reserved for delimiters, and text found between {{ }} is taken to define a verb/adverb/conjunction. The text may be multiple lines long and may contain other embedded definitions. The part of speech of the defined entity is inferred from the words in it. 
  • DGEMM - matrix matrix multiply. [2022-10-13]. (原始内容存档于2022-10-10). 
  • A. D. Falkoff英语Adin Falkoff, K. E. Iverson. APL\360 User's Manual (PDF). IBM. August 1968 [2022-07-09]. (原始内容存档 (PDF)于2021-10-27). 
    Table 3.9 shows the detailed definitions of transposition for a variety of cases. ……
    Case ⍴R Definition
    R←1⍉V ⍴V R←V
    R←1 2⍉M ⍴M R←M
    R←2 1⍉M (⍴M)[2 1] R[I;J]←M[J;I]
    R←1 1⍉M ⌊/⍴M R[I]←M[I;I]
    R←1 2 3⍉T ⍴T R←T
    R←1 3 2⍉T (⍴T)[1 3 2] R[I;J;K]←T[I;K,J]
    R←2 3 1⍉T (⍴T)[3 1 2] R[I;J;K]←T[J;K;I]
    R←3 1 2⍉T (⍴T)[2 3 1] R[I;J;K]←T[K;I;J]
    R←1 1 2⍉T (⌊/(⍴T)[1 2]),(⍴T)[3] R[I;J]←T[I;I;J]
    R←1 2 1⍉T (⌊/(⍴T)[1 3]),(⍴T)[2] R[I;J]←T[I;J;I]
    R←2 1 1⍉T (⌊/(⍴T)[2 3]),(⍴T)[1] R[I;J]←T[J;I;I]
    R←1 1 1⍉T ⌊/⍴T R[I]←T[I;I;I]
    Table 3.9: TRANSPOSITION
  • Roger Hui. dyadic transpose, a personal history. 22 May 2020 [2022-08-08]. (原始内容存档于2022-08-08). Dyadic transpose, x⍉y, is probably one of the last primitives to be mastered for an APLer, but is actually straightforward to describe. 
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). If P is any permutation of the indices of the axes of an array A, then P⍉A is an array similar to A except that the axes are permuted: the Ith axis becomes the P[I]th axis of the result. Hence, if R←P⍉A, then (⍴R)[P] is equal to ⍴A. For example:
          A←2 3 5 7⍴⍳210
          ⍴A
    2 3 5 7
          P←2 3 4 1
          ⍴P⍉A
    7 2 3 5
    ……
    The monadic transpose ⍉A reverses the order of the axes of its argument. Formally, ⍉A is equivalent to (⌽⍳⍴⍴A)⍉A.
     
    上面的APL转置运算规定中,不将多个轴映射到结果中的一个轴的简单示例,所对应的J语言代码:
       transpose=: {{(/: x) |: y}}
       a=: >:i. 2 3 5 7 
       $ a
    2 3 5 7
       p=: 2 3 4 1 
       $ p transpose a
    7 2 3 5
    
  • Kenneth E. Iverson. Operators and Functions. 1978 [2022-06-21]. (原始内容存档于2022-06-24). The use of the indexing function will be illustrated in a proof of the useful identity i⍉j⍉a ↔ i[j]⍉a. We first state the definition of the transpose as follows: if k is any vector index of j⍉a then
          k⌷j⍉a ↔ k[j]⌷a
    Then:
          k⌷i⍉j⍉a
          k[i]⌷j⍉a
          (k[i])[j]⌷a
          k[i[j]]⌷a
          k⌷i[j]⍉a
     
    Kenneth E. Iverson的上述二元转置定义,用J语言写为(<k){j|:a(<(/:j){k){a,而恒等式i|:j|:a(i{j)|:a的推导过程相应如下:
       (<k){i|:j|:a
       (<(/:i){k){j|:a 
       (<(/:j){(/:i){k){a
       (<k){(/:(/:j){(/:i))|:a
       (<k){(i{j)|:a
    
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Well, we don’t know what Ken Iverson’s favorite APL expression was or if he even had a favorite APL expression. But we can guess. From A History of APL in 50 Functions [Hui 2016a, §8]:
        ⊢ x←,1
           1
        ⊢ x←(0,x)+(x,0)
           1 1
        ⊢ x←(0,x)+(x,0)
           1 2 1
        ⊢ x←(0,x)+(x,0)
           1 3 3 1
    The expression (0,x)+(x,0) or its commute, which generates the next set of binomial coefficients, …….
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). What is being indexed is an array (of course) but the indices themselves (the “subscripts”) can also be arrays. For example [Hui 2016a, §4]:
        x← 3 1 4 1 5 9
        '.⎕'[x∘.>⍳⌈⌿x]
    ……
    In the example, the 2-element character vector '.⎕' is indexed by a 6-by-9 Boolean matrix.
     
  • IBM. APL Language (PDF). June 1976 [2022-07-02]. (原始内容存档 (PDF)于2019-09-26). More generally, Q⍉A is a valid expression if Q is any vector equal in length to the rank of A which is "complete" in the sense that if its items include any integer N they also include all positive integers less then N. For example, if ⍴⍴A is 3, then 1 1 2 and 2 1 1 and 1 1 1 are suitable values for Q but 1 3 1 is not. Just as for the case P⍉A where P is a permutation, the Ith axis becomes the Q[I]th axis of Q⍉A. However, in this case two or more of the axes of A may map into a single axis of the result, thus producing a diagonal section of A as illustrated below:
    ……
          B←3 5⍴⍳15
          B
     1  2  3  4  5
     6  7  8  9 10
    11 12 13 14 15
          1 1⍉B
    1 7 13
     
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Monadic was originally defined only on numeric vectors, and was extended [Wooster 1980] to work on numeric arrays with higher rank. With that extension it has the distinction of being the first APL primitive function defined to work on major cells, before the term was invented or the importance of the concept realized. It was later extended to work on character arrays in Dyalog APL in 1982. More recently, was extended in J to work with a TAO (total array ordering) [Hui 1996] on a suggestion by Whitney. TAO was taken up by Dyalog APL in 2018 [Brudzewsky et al. 2018]. The TAO also extends the left domain of . (The expression above for getting grade from sort requires TAO.) 
  • A History of APL in 50 Functions - 19. Permutations. [2022-09-27]. (原始内容存档于2022-09-27). 
  • J implementation of Fold primitives. [2022-11-01]. (原始内容存档于2022-11-01). 
  • Roger K. W. Hui, Morten J. Kromberg. APL since 1978. Proceedings of the ACM on Programming Languages, Volume 4, Issue HOPL. 2020 [2022-06-20]. (原始内容存档于2022-07-10). Key is a monadic operator. In the dyadic case of the derived function ⍺ f⌸ ⍵, major cells of specify keys for the corresponding major cells of , and f is applied to each unique key in and the selection of cells in having that key. In the monadic case of the derived function, f⌸⍵ ↔ ⍵ f⌸ ⍳≢⍵: f is applied to each unique key in and the indices in of that key.
    Key was defined and implemented in J in 1989 or 1990 [Hui 2007] and in Dyalog APL in 2015 [Dyalog 2015; Hui 2020b]. It is motivated by the “generalized beta” operation in The Connection Machine [Hillis 1985, §2.6], but generalizes the generalized beta by accepting arrays of any rank, not just vectors, and by permitting any function, not just reductions (folds). Key is also cognate with the GROUP BY statement in SQL. ……
    The following snippet solves a “Programming Pearls” puzzle [Bentley 1983]: given a dictionary of English words, here represented as the character matrix a, find all sets of anagrams. ……he algorithm works by sorting the rows individually (note the use of the rank operator (§3.1)), and these sorted rows are used as keys (“signatures” in the Programming Pearls description) to group the rows of the matrix. As the anagram example illustrates, other APL functions can be used to create the requisite keys.
     
  • Sqlite enhanced API for J. [2022-10-20]. (原始内容存档于2022-10-22). 
    Addons/data/sqlite/Overview. [2022-09-20]. (原始内容存档于2022-09-20). 

wikipedia.org

en.wikipedia.org

  • Roger K.W. Hui, Kenneth E. Iverson, E. E. McDonnell英语Eugene McDonnell, Arthur T. Whitney. APL\?. 1990 [2022-06-12]. (原始内容存档于2022-06-14). This paper describes a version of APL based upon the dictionary, but significantly simplified and enhanced, and directly usable on any machine that provides ASCII characters. It also describes salient features of a C implementation that has been tested on several machines, and is available as freeware. 
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). In combinatory logic one of the most useful primitive combinators is designated by S [Sch24]. Curry defines Sfgx in prefix notation to be fx(gx) [CuFeCr74]. In common mathematical infix notation this would be given by (x)f(g(x)), which one can write in APL as xfgx, and this is the hook form (fg)x. The combinatory logician appreciates this form because of its great expressiveness: it can be shown that S, along with K, the constancy combinator, suffice to define all other combinators of interest [Ro50]. (The constancy combinator K is defined in infix notation so that cKx has the value c for all x.) Users of APL will appreciate the hook for the same reasons. 
  • Kenneth E. Iverson, Eugene McDonnell英语Eugene McDonnell. Phrasal Forms. APL 89 Conference Proceedings. August 1989 [2022-06-09]. (原始内容存档于2022-06-12). Curry [Cu31] defines a formalizing combinator, Φ, in prefix notation, such that Φfghx means f(gx)(hx). In common mathematical infix notation this would be designated by (g(x))f(h(x)). An example of this form is Φ+sin2cos2θ, meaning sin2θ+cos2θ. The fork (f g h)⍵ has the same meaning, namely (f⍵)g(h⍵). Curry named this the formalizing combinator because of its role in defining formal implication in terms of ordinary implication.
    Iverson and Whitney have made several earlier suggestions of ways to achieve what the fork form provides: the scalar operators of [Iv78], [Iv79a], [Iv 79b], the til operator of [Iv82], the union and intersection conjunctions of [Iv87], and the yoke adverb of [Iv88]. Benkard [Bk87] has also suggested a way to achieve the meaning of this form, in his proposal for ↑g/(f h)⍺ ⍵, using the notion of function pair ( is APL2’s first function). The present proposal has significant advantages over these earlier ones.
     
  • Roger K.W. Hui, Kenneth E. Iverson, Eugene E. McDonnell英语Eugene McDonnell. Tacit Definition. 1991 [2022-06-11]. (原始内容存档于2022-07-06). To appreciate the more general use of tacit definition, it is necessary to understand three key notions of J: cells and rank, forks, and composition.……
    The conjunction & is called with, and applies to nouns (variables) a and b as well as to verbs f and g as follows:
      a&g y is a g y
      f&b y is x f y
      f&g y is f g y
    x f&g y is (g x) f (g y)
    ……
    A number of other constructs in J similarly enhance the utility of tacit definitions. The more important are the under (or dual), atop (a second form of composition), the power conjunction ^:, and further forms of partitions.
     
    Jsoftware. Changes in Version 3.2, 1991 06 02. 1991 [2022-11-07]. (原始内容存档于2022-06-14).
    @.    agenda
    @:    at
    &:    appose
     
  • Robert Bernecky英语Robert Bernecky, Roger K. W. Hui. Gerunds and representations. 1991 [2022-06-12]. (原始内容存档于2022-06-12). Gerunds, verbal forms that can be used as nouns, are recognized as having utility in the realm of programming languages. We show that gerunds can be viewed as arrays of atomic repmentations of verbs (functions), in a way which is consistent with the syntax and semantics of APL, and which allows verbs to be first class objects in the language. We define derivations of verbs from gerunds in the J dialect of APL, and show how these derivations provide control structures for sequencing, selection (in the sense of generalized forms of CASE or SWITCH statements and IF/THEN/ELSE), iteration (DO UNTIL), recursion, and parallel computation (MIMD, or Multiple Instruction, Multiple Data). We conclude with alternative representations of verbs which are useful in other contexts. 
    Jsoftware. Changes in Version 4.0, 1991 11 23. 1991 [2022-06-12]. (原始内容存档于2022-06-14).
    `:1    replaced by u^:v
    `:4    replaced by m~
    `:5    replaced by @.
     
  • James A. Brown英语Jim Brown (computer scientist). The Principles of APL2. TR 03.247. IBM Santa Teresa Laboratory, San Jose, California. 1984 [2022-06-23]. (原始内容存档于2022-06-12). APL2 is based on this writer' s PhD Thesis [Br1], the array theory of Trenchard More [Mo1] and most of all on APL1. ……
    The arrays of APL2 are finite rectangular arrays which contain arrays as items. When the term array is used, it means this subset of all possible arrays.
    The arrays of APL2 are the same as the arrays of Array Theory and in particular empty arrays have structure as defined by Array Theory [Mo1 etc.].
    An array one of whose items is other than a single number or character (a simple scalar) is called a nested array. An array containing only numbers or containing only characters is called a homogeneous array. An array all of whose items are either single numbers or single characters is called a simple array. The arrays of APL1 are simple and homogeneous.
    In some sense every array in APL2 is nested because it contains other arrays. The term is reserved for those which contain at least one item which is not a single number or character. Thus the universe of arrays is partitioned into two subsets: simple arrays and nested arrays. ……
    A function is pervasive if pick distributes over it. ……
    Since the pick function may select an item at an arbitrary depth in a nested array, it may select deep enough to access a simple scalar (because nested arrays have finite depth). Thus a pervasive function may be thought of as applying independently to each simple scalar in its argument(s). ……
    In APL2 the scalar functions and only the scalar functions are pervasive.
     
  • John Scholes英语John M. Scholes. Direct Functions in Dyalog APL (PDF). October 1996 [2022-06-30]. (原始内容存档 (PDF)于2021-10-05). A Direct Function (dfn) is a new function definition style, which bridges the gap between named function expressions such as rank←⍴∘⍴ and APL’s traditional ‘header’ style definition. 
    System/ReleaseNotes/J902. 14 May 2020 [2022-06-30]. (原始内容存档于2022-07-03). Explicit entities can be defined using direct definition. The digraphs {{ and }} are reserved for delimiters, and text found between {{ }} is taken to define a verb/adverb/conjunction. The text may be multiple lines long and may contain other embedded definitions. The part of speech of the defined entity is inferred from the words in it. 
  • A. D. Falkoff英语Adin Falkoff, K. E. Iverson. APL\360 User's Manual (PDF). IBM. August 1968 [2022-07-09]. (原始内容存档 (PDF)于2021-10-27). 
    Table 3.9 shows the detailed definitions of transposition for a variety of cases. ……
    Case ⍴R Definition
    R←1⍉V ⍴V R←V
    R←1 2⍉M ⍴M R←M
    R←2 1⍉M (⍴M)[2 1] R[I;J]←M[J;I]
    R←1 1⍉M ⌊/⍴M R[I]←M[I;I]
    R←1 2 3⍉T ⍴T R←T
    R←1 3 2⍉T (⍴T)[1 3 2] R[I;J;K]←T[I;K,J]
    R←2 3 1⍉T (⍴T)[3 1 2] R[I;J;K]←T[J;K;I]
    R←3 1 2⍉T (⍴T)[2 3 1] R[I;J;K]←T[K;I;J]
    R←1 1 2⍉T (⌊/(⍴T)[1 2]),(⍴T)[3] R[I;J]←T[I;I;J]
    R←1 2 1⍉T (⌊/(⍴T)[1 3]),(⍴T)[2] R[I;J]←T[I;J;I]
    R←2 1 1⍉T (⌊/(⍴T)[2 3]),(⍴T)[1] R[I;J]←T[J;I;I]
    R←1 1 1⍉T ⌊/⍴T R[I]←T[I;I;I]
    Table 3.9: TRANSPOSITION