Search results

Jump to navigation Jump to search
  • #### liftM2 is just short for do { x <- act1; y <- act2; return (x `op` y) }
    10 KB (1,520 words) - 07:20, 10 November 2020
  • , Assign y (IntConst 7) , Assign p ( BinExpr Add (Var p) (Var y) )
    28 KB (3,540 words) - 18:19, 5 January 2015
  • class HBool b => TypeEq x y b | x y -> b
    15 KB (2,199 words) - 00:32, 23 May 2017
  • ...ything besides some accessors (untrie f XB and untrie f YB for accessing x/y components resp. of V2). We already have Coordinates and HasBasis though, s * linear? - supported in Z3, I implemented a few (alignAxis, spacingX/Y)
    10 KB (1,671 words) - 03:59, 16 August 2014
  • ...inuation <tt>k</tt> contains the code that will be executed after <tt>(+ x y)</tt> is calculated."
    6 KB (866 words) - 02:16, 2 May 2024
  • sudo aptitude install binutils-gold -y ...gtkimageview-dev libpoppler-glib-dev poppler-data libtagc0-dev libvte-dev -y
    12 KB (1,458 words) - 02:36, 26 April 2021
  • Again, in this term, <hask>k'</hask> is bound to <hask>\y -> reset [x + y]</hask>, so <hask>k</hask> is the function ...answer to the question which one GHC chooses when no signature is given is less satisfactory: It depends on the status of the flag <hask>-f(no)monomorphism
    35 KB (5,673 words) - 20:05, 7 July 2015
  • lamE [foldr (\x y -> conP '(:) [varP x,y]) wildP ns] (tupE $ map varE ns) getopt (THNoArg pat) = lamE [varP "y"] (caseE (varE "y") [cons0, cons1])
    30 KB (4,551 words) - 00:29, 15 June 2023
  • ...ience may actually have an easier time learning Haskell, because they have less to un-learn. f x y = do ...
    36 KB (5,814 words) - 22:06, 10 May 2024
  • mischief x = let y = 141421 * x y
    20 KB (3,555 words) - 06:05, 24 April 2024
  • let printLine a y = mapM (\x -> readBoard a (x,y)) [1..9] >>= mapM_ (putStr . show) in do
    67 KB (9,593 words) - 05:40, 9 March 2021
  • unify x y | x == y = x
    17 KB (2,482 words) - 20:34, 8 June 2017
  • ...ests, it needs to handle each event in a rather short period of time (e.g. less that 200 milliseconds, as a rule of thumb)
    5 KB (883 words) - 14:29, 3 April 2014
  • render Squeeze = map head. groupBy (\x y -> all (all isSpace) [x,y]) render Squeeze = map head. groupBy (\x y -> all (all isSpace) [x,y])
    25 KB (3,657 words) - 18:20, 12 September 2015
  • ,'O'),((3,3),'P'),((4,3),'P'),((5,3),'Y'),((3,5),'A'),((4,5),'R'),((5,5),'E'),((
    8 KB (894 words) - 02:36, 25 November 2022
  • "(function(x,y){return (x - (x % y))/y;})(exprEval(a),exprEval(b));"
    21 KB (3,466 words) - 15:19, 6 February 2021
  • .... If you indent more, it's part of the previous statement. If you indent less, it ends the <hask>do</hask> block. This is called "layout", and Haskell u Prelude> :t [('x', True), ('y', False)]
    13 KB (1,986 words) - 17:59, 9 August 2019
  • ...orresponding to <i>n (log n)<sup>2</sup> log log n</i> complexity, more or less, in ''n'' primes produced): minus (x:xs) (y:ys) = case (compare x y) of
    58 KB (8,594 words) - 20:34, 6 May 2023
  • substitute x y = Wrp (unsafeCoerce x::t2) substitute x y = Wrp (unsafeCoerce x::t2)
    34 KB (2,180 words) - 13:00, 20 October 2017
  • * [[Ce tip are combinatorul Y ?]] 1.5 * [[Ce tip are Y - combinatorul paradoxal ?]]
    14 KB (1,971 words) - 23:12, 9 April 2021

View (previous 20 | next 20) (20 | 50 | 100 | 250 | 500)