Search results

Jump to navigation Jump to search
  • ...en2 -bg '#324c80' -fg '#adbadd' -e '' -ta l -w 400 -fn '-misc-fixed-medium-r-normal-*-14-*-*-*-*-*-*-*'" ...| dzen2 -e '' -x 400 -w 880 -ta r -fg $FG -bg $BG -fn '-misc-fixed-medium-r-normal-*-14-*-*-*-*-*-*-*' &
    2 KB (236 words) - 00:49, 27 January 2018
  • Left l, Right r -> l + r ModDur (Tempo r) d -> d / r
    3 KB (470 words) - 23:09, 11 July 2021
  • filled (Branch _ l r) = [True] : zipWith (++) (filled l) (filled r)... (r, xss'') = cbt xss'
    9 KB (727 words) - 03:41, 10 January 2017
  • foldr (\p r -> p*p > n || ((n `rem` p) /= 0 && r)) | r == 0 = p : go q ps
    4 KB (605 words) - 17:09, 18 July 2022
  • uncompress t x = let (r,_) = runState (bar t) x in r do r <- baz
    8 KB (1,072 words) - 18:32, 16 January 2017
  • countNodes (Branch _ l r) = countNodes l + countNodes r + 1 baltree h n = [Branch x l r |
    3 KB (407 words) - 13:38, 25 December 2016
  • where rand = do r <- randomRIO (0, (length xs) - 1) return (xs!!r)
    4 KB (666 words) - 13:03, 10 May 2014
  • r x = fromJust . find ((== x) . snd) $ t putStrLn . unwords . map fst . head . sort . map (sort . map r) . sol $ n
    1 KB (177 words) - 22:56, 5 April 2021
  • class Resturi r where x :: r -> r
    4 KB (586 words) - 15:17, 6 February 2021
  • ...ient function phi(m) is defined as the number of positive integers r (1 <= r < m) that are coprime to m.
    1 KB (224 words) - 19:44, 18 January 2014
  • ...bject <math>A</math> of <math>\mathcal{C}</math> to <math>R^{\mathcal{C}(A,R)}</math> corresponding to the CPS monad in Haskell.
    3 KB (547 words) - 07:53, 16 April 2019
  • tree2ds (Branch x l r) = x:(tree2ds l ++ tree2ds r)
    3 KB (285 words) - 03:44, 10 January 2017
  • | y == x = let (f,r) = getReps ys in (y:f, r)
    2 KB (347 words) - 21:03, 20 December 2018
  • rec p <- newIORef (Node 0 r) r <- newIORef (Node 1 p)
    10 KB (1,757 words) - 23:34, 24 July 2021
  • newtype ContT r m a ...type <hask>a</hask> and a final result of type <hask>r</hask>. The <hask>r</hask> type can be polymorphic most of the time. You only need to specify
    12 KB (2,067 words) - 05:43, 9 March 2021
  • *<code>C-c C-r</code> reload current Haskell interpreter session ...>C-c C-l</code> to load the file. Then, you can go on to type <code>C-c C-r</code> (or simply <code>C-c C-l</code> again) to reload the current module
    2 KB (358 words) - 18:22, 11 April 2016
  • ChurchList { runList :: forall r. (a -> r -> r) -> r -> r }
    4 KB (693 words) - 13:33, 15 April 2024
  • f :: forall %r. () -> () -> Int %r Remember that the <hask>forall %r</hask> at the front of the type is supposed to indicate that the return val
    3 KB (472 words) - 04:20, 8 June 2023
  • instance ParseTree ('Down c ': 'Up ': r) ('Node c '[]) r instance ParseForest ('Down d ': is) (t ': ts) r
    7 KB (1,025 words) - 02:14, 23 July 2021
  • = do r <- getStdRandom (randomR (1,prob)) let curr' = if r == 1 then orig else (next:curr)
    6 KB (855 words) - 12:54, 26 June 2017

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