Search is not available for this dataset
repo_name
string
path
string
license
string
full_code
string
full_size
int64
uncommented_code
string
uncommented_size
int64
function_only_code
string
function_only_size
int64
is_commented
bool
is_signatured
bool
n_ast_errors
int64
ast_max_depth
int64
n_whitespaces
int64
n_ast_nodes
int64
n_ast_terminals
int64
n_ast_nonterminals
int64
loc
int64
cycloplexity
int64
nshaheed/flipbook
src/Graphics/Flipbook/Effects.hs
bsd-3-clause
combine (x:xs) t = runActive x t >> combine xs t
48
combine (x:xs) t = runActive x t >> combine xs t
48
combine (x:xs) t = runActive x t >> combine xs t
48
false
false
1
8
10
34
15
19
null
null
jean-edouard/manager
dbd2/Path.hs
gpl-2.0
parentPath :: Path -> Path parentPath [] = []
45
parentPath :: Path -> Path parentPath [] = []
45
parentPath [] = []
18
false
true
0
6
8
22
11
11
null
null
spechub/Hets
Static/GTheory.hs
gpl-2.0
-- | simplify a theory (throw away qualifications) simplifyTh :: G_theory -> G_theory simplifyTh (G_theory lid gsyn sigma@(ExtSign s _) ind1 sens ind2) = G_theory lid gsyn sigma ind1 (OMap.map (mapValue $ simplify_sen lid s) sens) ind2
245
simplifyTh :: G_theory -> G_theory simplifyTh (G_theory lid gsyn sigma@(ExtSign s _) ind1 sens ind2) = G_theory lid gsyn sigma ind1 (OMap.map (mapValue $ simplify_sen lid s) sens) ind2
194
simplifyTh (G_theory lid gsyn sigma@(ExtSign s _) ind1 sens ind2) = G_theory lid gsyn sigma ind1 (OMap.map (mapValue $ simplify_sen lid s) sens) ind2
159
true
true
0
10
46
83
41
42
null
null
haroldcarr/learn-haskell-coq-ml-etc
haskell/topic/trees-that-grow-and-shrink/2017-09-spj-trees-that-grow/TTG.hs
unlicense
incLit e = e
20
incLit e = e
20
incLit e = e
20
false
false
0
4
11
9
4
5
null
null
nevrenato/HetsAlloy
CspCASL/SignCSP.hs
gpl-2.0
relatedCommAlpha :: CspCASLSign -> CommAlpha -> CommAlpha -> Bool relatedCommAlpha sig al1 al2 = Set.null al1 || Set.null al2 || any (\ a -> any (relatedCommTypes sig a) $ Set.toList al1) (Set.toList al2)
206
relatedCommAlpha :: CspCASLSign -> CommAlpha -> CommAlpha -> Bool relatedCommAlpha sig al1 al2 = Set.null al1 || Set.null al2 || any (\ a -> any (relatedCommTypes sig a) $ Set.toList al1) (Set.toList al2)
206
relatedCommAlpha sig al1 al2 = Set.null al1 || Set.null al2 || any (\ a -> any (relatedCommTypes sig a) $ Set.toList al1) (Set.toList al2)
140
false
true
0
12
34
89
43
46
null
null
phischu/fragnix
builtins/integer-gmp/GHC.Integer.Type.hs
bsd-3-clause
gcdInteger (Jn# a) b = gcdInteger (Jp# a) b
43
gcdInteger (Jn# a) b = gcdInteger (Jp# a) b
43
gcdInteger (Jn# a) b = gcdInteger (Jp# a) b
43
false
false
0
7
8
28
13
15
null
null
TGOlson/haskell-tic-tac-toe
Src/TicTacToe.hs
mit
getCurrentPlayer :: TicTacToeState -> Player getCurrentPlayer (GameState xs) = if pXCount > pOCount then playerO else playerX where pXCount = length $ filter isPlayerXSymbol xs pOCount = length $ filter isPlayerOSymbol xs
231
getCurrentPlayer :: TicTacToeState -> Player getCurrentPlayer (GameState xs) = if pXCount > pOCount then playerO else playerX where pXCount = length $ filter isPlayerXSymbol xs pOCount = length $ filter isPlayerOSymbol xs
231
getCurrentPlayer (GameState xs) = if pXCount > pOCount then playerO else playerX where pXCount = length $ filter isPlayerXSymbol xs pOCount = length $ filter isPlayerOSymbol xs
186
false
true
1
7
41
68
34
34
null
null
Peaker/FTGL
Graphics/Rendering/FTGL.hs
bsd-2-clause
readTextAlignment 3 = Justify
29
readTextAlignment 3 = Justify
29
readTextAlignment 3 = Justify
29
false
false
0
5
3
9
4
5
null
null
allanderek/ipclib
Language/Ptrees/Evaluate.hs
gpl-2.0
evaluateEventTree _env etree = return etree
54
evaluateEventTree _env etree = return etree
54
evaluateEventTree _env etree = return etree
54
false
false
0
5
16
14
6
8
null
null
gridaphobe/target
test/MapTest.hs
mit
union_bad t1 t2 = hedgeUnion_bad NothingS NothingS t1 t2
56
union_bad t1 t2 = hedgeUnion_bad NothingS NothingS t1 t2
56
union_bad t1 t2 = hedgeUnion_bad NothingS NothingS t1 t2
56
false
false
0
5
8
20
9
11
null
null
agrafix/rocksdb-haskell
src/Database/RocksDB/Internal.hs
bsd-3-clause
freeFilterPolicy :: FilterPolicy' -> IO () freeFilterPolicy (FilterPolicy' ccffun ckmfun cdest cname cfp) = do c_rocksdb_filterpolicy_destroy cfp freeHaskellFunPtr ccffun freeHaskellFunPtr ckmfun freeHaskellFunPtr cdest freeHaskellFunPtr cname
263
freeFilterPolicy :: FilterPolicy' -> IO () freeFilterPolicy (FilterPolicy' ccffun ckmfun cdest cname cfp) = do c_rocksdb_filterpolicy_destroy cfp freeHaskellFunPtr ccffun freeHaskellFunPtr ckmfun freeHaskellFunPtr cdest freeHaskellFunPtr cname
263
freeFilterPolicy (FilterPolicy' ccffun ckmfun cdest cname cfp) = do c_rocksdb_filterpolicy_destroy cfp freeHaskellFunPtr ccffun freeHaskellFunPtr ckmfun freeHaskellFunPtr cdest freeHaskellFunPtr cname
220
false
true
0
7
44
67
28
39
null
null
ekmett/ghc
compiler/codeGen/StgCmmPrim.hs
bsd-3-clause
translateOp dflags XorIOp = Just (mo_wordXor dflags)
60
translateOp dflags XorIOp = Just (mo_wordXor dflags)
60
translateOp dflags XorIOp = Just (mo_wordXor dflags)
60
false
false
0
7
14
20
9
11
null
null
kevinjardine/gruzeSnaplet
src/Snap/Snaplet/Gruze/Box.hs
gpl-2.0
ppAtom (GrzAtomBool True) = "True"
34
ppAtom (GrzAtomBool True) = "True"
34
ppAtom (GrzAtomBool True) = "True"
34
false
false
0
7
4
15
7
8
null
null
tomahawkins/trs
Language/TRS/Language.hs
bsd-3-clause
bits a = msb a : bits (lsbs a)
30
bits a = msb a : bits (lsbs a)
30
bits a = msb a : bits (lsbs a)
30
false
false
3
7
8
30
11
19
null
null
gambogi/csh-eval
src/CSH/Eval/Cacheable/Prim.hs
mit
-- | Atomically read a segment record, passing control to interior transformer -- on failure. hitRecordFallback :: Ord k => k -- ^ The sought out object's ID -> M.Map k (MVar v) -- ^ Cache segment -> CacheM v -- ^ Action to run to retrieve target -- value on failure -> CacheM v hitRecordFallback = ((flip fromMaybe . ((liftIO . readMVar) <$>)) .) . M.lookup
495
hitRecordFallback :: Ord k => k -- ^ The sought out object's ID -> M.Map k (MVar v) -- ^ Cache segment -> CacheM v -- ^ Action to run to retrieve target -- value on failure -> CacheM v hitRecordFallback = ((flip fromMaybe . ((liftIO . readMVar) <$>)) .) . M.lookup
399
hitRecordFallback = ((flip fromMaybe . ((liftIO . readMVar) <$>)) .) . M.lookup
79
true
true
0
11
203
86
47
39
null
null
tomphp/haskell-tictactoe
src/TicTacToe/Board.hs
mit
contains :: Eq a => Board a -> Maybe a -> Bool contains b c = c `elem` boardCells b
83
contains :: Eq a => Board a -> Maybe a -> Bool contains b c = c `elem` boardCells b
83
contains b c = c `elem` boardCells b
36
false
true
0
8
19
46
22
24
null
null
y-usuzumi/goblin-workshop
app/Examples/2.hs
bsd-3-clause
runningAttr :: AttrName runningAttr = attrName "running"
56
runningAttr :: AttrName runningAttr = attrName "running"
56
runningAttr = attrName "running"
32
false
true
0
6
6
21
8
13
null
null
begriffs/postgrest
src/PostgREST/QueryBuilder.hs
mit
pgFmtOrderTerm :: QualifiedIdentifier -> OrderTerm -> SqlFragment pgFmtOrderTerm qi ot = unwords [ toS . pgFmtField qi $ otTerm ot, maybe "" show $ otDirection ot, maybe "" show $ otNullOrder ot]
201
pgFmtOrderTerm :: QualifiedIdentifier -> OrderTerm -> SqlFragment pgFmtOrderTerm qi ot = unwords [ toS . pgFmtField qi $ otTerm ot, maybe "" show $ otDirection ot, maybe "" show $ otNullOrder ot]
201
pgFmtOrderTerm qi ot = unwords [ toS . pgFmtField qi $ otTerm ot, maybe "" show $ otDirection ot, maybe "" show $ otNullOrder ot]
135
false
true
0
9
37
74
35
39
null
null
nikita-volkov/stm-containers
library/StmContainers/Bimap.hs
mit
lookupRight :: (Eq leftKey, Hashable leftKey, Eq rightKey, Hashable rightKey) => rightKey -> Bimap leftKey rightKey -> STM (Maybe leftKey) lookupRight rightKey (Bimap _ rightMap) = A.lookup rightKey rightMap
209
lookupRight :: (Eq leftKey, Hashable leftKey, Eq rightKey, Hashable rightKey) => rightKey -> Bimap leftKey rightKey -> STM (Maybe leftKey) lookupRight rightKey (Bimap _ rightMap) = A.lookup rightKey rightMap
209
lookupRight rightKey (Bimap _ rightMap) = A.lookup rightKey rightMap
70
false
true
0
10
30
80
39
41
null
null
MP2E/XMonadContrib
XMonad/Layout/BinarySpacePartition.hs
bsd-3-clause
oppositeSplit :: Split -> Split oppositeSplit (Split d r) = Split (oppositeDirection d) r
89
oppositeSplit :: Split -> Split oppositeSplit (Split d r) = Split (oppositeDirection d) r
89
oppositeSplit (Split d r) = Split (oppositeDirection d) r
57
false
true
0
7
13
37
18
19
null
null
brendanhay/gogol
gogol-slides/gen/Network/Google/Slides/Types/Product.hs
mpl-2.0
-- | The style of the arrow at the end of the line. lpEndArrow :: Lens' LineProperties (Maybe LinePropertiesEndArrow) lpEndArrow = lens _lpEndArrow (\ s a -> s{_lpEndArrow = a})
179
lpEndArrow :: Lens' LineProperties (Maybe LinePropertiesEndArrow) lpEndArrow = lens _lpEndArrow (\ s a -> s{_lpEndArrow = a})
127
lpEndArrow = lens _lpEndArrow (\ s a -> s{_lpEndArrow = a})
61
true
true
0
9
31
48
25
23
null
null
UBMLtonGroup/timberc
src/Syntax2Core.hs
bsd-3-clause
s2cE env e = internalError "s2cE: did not expect" e
80
s2cE env e = internalError "s2cE: did not expect" e
80
s2cE env e = internalError "s2cE: did not expect" e
80
false
false
0
5
38
16
7
9
null
null
diku-dk/futhark
src/Futhark/Optimise/Fusion.hs
isc
----------------------------------- ---- Generic Traversal ---- ----------------------------------- fusionGatherExp fres e = addNamesToInfusible fres $ freeIn e
169
fusionGatherExp fres e = addNamesToInfusible fres $ freeIn e
60
fusionGatherExp fres e = addNamesToInfusible fres $ freeIn e
60
true
false
0
6
23
24
12
12
null
null
isomorphism/csound-expression
src/Csound/Air/Misc.hs
bsd-3-clause
impNightPad :: D -> Sig -> Sig impNightPad dt = (fadeIn dt * ) . stringPad 1
76
impNightPad :: D -> Sig -> Sig impNightPad dt = (fadeIn dt * ) . stringPad 1
76
impNightPad dt = (fadeIn dt * ) . stringPad 1
45
false
true
0
7
16
36
18
18
null
null
gridaphobe/ghc
compiler/deSugar/Coverage.hs
bsd-3-clause
addTickHsCmd (HsCmdLet (L l binds) c) = bindLocals (collectLocalBinders binds) $ liftM2 (HsCmdLet . L l) (addTickHsLocalBinds binds) -- to think about: !patterns. (addTickLHsCmd c)
236
addTickHsCmd (HsCmdLet (L l binds) c) = bindLocals (collectLocalBinders binds) $ liftM2 (HsCmdLet . L l) (addTickHsLocalBinds binds) -- to think about: !patterns. (addTickLHsCmd c)
236
addTickHsCmd (HsCmdLet (L l binds) c) = bindLocals (collectLocalBinders binds) $ liftM2 (HsCmdLet . L l) (addTickHsLocalBinds binds) -- to think about: !patterns. (addTickLHsCmd c)
236
false
false
0
9
80
68
33
35
null
null
ancientlanguage/haskell-analysis
grammar/src/Grammar/Common/Decompose.hs
mit
decomposeChar '\x04C2' = "\x0436\x0306"
39
decomposeChar '\x04C2' = "\x0436\x0306"
39
decomposeChar '\x04C2' = "\x0436\x0306"
39
false
false
0
5
3
9
4
5
null
null
ccatalfo/marc
test/Test.hs
mit
testGetFieldAndSubfield :: MarcFileResource -> Assertion testGetFieldAndSubfield (MarcFileResource marcString) = let record = readFromString marcString in assertEqual "it should find 245$a" (Just "3DMove") $ (getFieldAndSubfield record "245" 'a')
272
testGetFieldAndSubfield :: MarcFileResource -> Assertion testGetFieldAndSubfield (MarcFileResource marcString) = let record = readFromString marcString in assertEqual "it should find 245$a" (Just "3DMove") $ (getFieldAndSubfield record "245" 'a')
272
testGetFieldAndSubfield (MarcFileResource marcString) = let record = readFromString marcString in assertEqual "it should find 245$a" (Just "3DMove") $ (getFieldAndSubfield record "245" 'a')
215
false
true
0
10
52
67
31
36
null
null
frerich/pandoc
src/Text/Pandoc/Writers/LaTeX.hs
gpl-2.0
inlineToLaTeX (Math InlineMath str) = return $ "\\(" <> text str <> "\\)"
75
inlineToLaTeX (Math InlineMath str) = return $ "\\(" <> text str <> "\\)"
75
inlineToLaTeX (Math InlineMath str) = return $ "\\(" <> text str <> "\\)"
75
false
false
2
7
14
34
15
19
null
null
frossi933/CSPi
haskell/Csp.hs
gpl-3.0
menu (Seq Stop q) = return $ Set.singleton Eps
46
menu (Seq Stop q) = return $ Set.singleton Eps
46
menu (Seq Stop q) = return $ Set.singleton Eps
46
false
false
0
7
8
26
12
14
null
null
LambdaHack/LambdaHack
definition-src/Game/LambdaHack/Definition/Color.hs
bsd-3-clause
-- | The default colours, to optimize attribute setting. defFG :: Color defFG = White
85
defFG :: Color defFG = White
28
defFG = White
13
true
true
0
4
14
12
7
5
null
null
svalaskevicius/hob
src/lib/Hob/Command/ReplaceText.hs
gpl-3.0
createMatcherForReplace :: Char -> (String -> String -> CommandHandler) -> CommandMatcher createMatcherForReplace prefix handler = CommandMatcher (const Nothing) match where match [] = Nothing match (p:ps) | p == prefix = matchSearchAndReplaceFromStart ps | otherwise = Nothing matchSearchAndReplaceFromStart [] = Nothing matchSearchAndReplaceFromStart (separator:xs) = matchSearchAndReplaceFromSearch separator xs "" matchSearchAndReplaceFromSearch _ [] _ = Nothing matchSearchAndReplaceFromSearch separator (x:xs) accumSearch | '\\' == x = case xs of [] -> Nothing (s:xss) -> if s == separator then matchSearchAndReplaceFromSearch separator xss (accumSearch++[separator]) else matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) | separator == x = matchSearchAndReplaceFromReplace separator xs accumSearch "" | otherwise = matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) matchSearchAndReplaceFromReplace _ [] search accumReplace = Just $ handler search accumReplace matchSearchAndReplaceFromReplace separator (x:xs) search accumReplace | '\\' == x = case xs of [] -> Just $ handler search (accumReplace++[x]) (s:xss) -> if s == separator then matchSearchAndReplaceFromReplace separator xss search (accumReplace++[separator]) else matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x]) | separator == x = Just $ handler search accumReplace | otherwise = matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x])
1,828
createMatcherForReplace :: Char -> (String -> String -> CommandHandler) -> CommandMatcher createMatcherForReplace prefix handler = CommandMatcher (const Nothing) match where match [] = Nothing match (p:ps) | p == prefix = matchSearchAndReplaceFromStart ps | otherwise = Nothing matchSearchAndReplaceFromStart [] = Nothing matchSearchAndReplaceFromStart (separator:xs) = matchSearchAndReplaceFromSearch separator xs "" matchSearchAndReplaceFromSearch _ [] _ = Nothing matchSearchAndReplaceFromSearch separator (x:xs) accumSearch | '\\' == x = case xs of [] -> Nothing (s:xss) -> if s == separator then matchSearchAndReplaceFromSearch separator xss (accumSearch++[separator]) else matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) | separator == x = matchSearchAndReplaceFromReplace separator xs accumSearch "" | otherwise = matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) matchSearchAndReplaceFromReplace _ [] search accumReplace = Just $ handler search accumReplace matchSearchAndReplaceFromReplace separator (x:xs) search accumReplace | '\\' == x = case xs of [] -> Just $ handler search (accumReplace++[x]) (s:xss) -> if s == separator then matchSearchAndReplaceFromReplace separator xss search (accumReplace++[separator]) else matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x]) | separator == x = Just $ handler search accumReplace | otherwise = matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x])
1,828
createMatcherForReplace prefix handler = CommandMatcher (const Nothing) match where match [] = Nothing match (p:ps) | p == prefix = matchSearchAndReplaceFromStart ps | otherwise = Nothing matchSearchAndReplaceFromStart [] = Nothing matchSearchAndReplaceFromStart (separator:xs) = matchSearchAndReplaceFromSearch separator xs "" matchSearchAndReplaceFromSearch _ [] _ = Nothing matchSearchAndReplaceFromSearch separator (x:xs) accumSearch | '\\' == x = case xs of [] -> Nothing (s:xss) -> if s == separator then matchSearchAndReplaceFromSearch separator xss (accumSearch++[separator]) else matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) | separator == x = matchSearchAndReplaceFromReplace separator xs accumSearch "" | otherwise = matchSearchAndReplaceFromSearch separator xs (accumSearch++[x]) matchSearchAndReplaceFromReplace _ [] search accumReplace = Just $ handler search accumReplace matchSearchAndReplaceFromReplace separator (x:xs) search accumReplace | '\\' == x = case xs of [] -> Just $ handler search (accumReplace++[x]) (s:xss) -> if s == separator then matchSearchAndReplaceFromReplace separator xss search (accumReplace++[separator]) else matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x]) | separator == x = Just $ handler search accumReplace | otherwise = matchSearchAndReplaceFromReplace separator xs search (accumReplace++[x])
1,738
false
true
0
15
523
489
245
244
null
null
ssaavedra/liquidhaskell
benchmarks/esop2013-submission/Base.hs
bsd-3-clause
insertLookupWithKey_go _ kx x Tip = (Nothing, singleton kx x)
61
insertLookupWithKey_go _ kx x Tip = (Nothing, singleton kx x)
61
insertLookupWithKey_go _ kx x Tip = (Nothing, singleton kx x)
61
false
false
0
6
9
26
13
13
null
null
getyourguide/fbthrift
thrift/compiler/test/fixtures/namespace/gen-hs/My/Namespacing/Test/HsTestService_Fuzzer.hs
apache-2.0
fuzzerFunctions :: [(String, (Options -> IO ()))] fuzzerFunctions = [("init", init_fuzzer)]
91
fuzzerFunctions :: [(String, (Options -> IO ()))] fuzzerFunctions = [("init", init_fuzzer)]
91
fuzzerFunctions = [("init", init_fuzzer)]
41
false
true
0
10
10
41
24
17
null
null
Athas/Sindre
Sindre/X11.hs
mit
fromXRect :: X.Rectangle -> Rectangle fromXRect r = Rectangle { rectX = fi $ rect_x r , rectY = fi $ rect_y r , rectWidth = fi $ rect_width r , rectHeight = fi $ rect_height r }
223
fromXRect :: X.Rectangle -> Rectangle fromXRect r = Rectangle { rectX = fi $ rect_x r , rectY = fi $ rect_y r , rectWidth = fi $ rect_width r , rectHeight = fi $ rect_height r }
223
fromXRect r = Rectangle { rectX = fi $ rect_x r , rectY = fi $ rect_y r , rectWidth = fi $ rect_width r , rectHeight = fi $ rect_height r }
185
false
true
0
8
83
74
39
35
null
null
mlite/hLLVM
src/Llvm/Pass/IrBuild.hs
bsd-3-clause
mkModule :: String -> Mc () mkModule mName = modify (\ms -> ms { moduleName = Just mName })
91
mkModule :: String -> Mc () mkModule mName = modify (\ms -> ms { moduleName = Just mName })
91
mkModule mName = modify (\ms -> ms { moduleName = Just mName })
63
false
true
0
10
18
45
23
22
null
null
kazu-yamamoto/wai-app-file-cgi
Network/Wai/Application/Classic/File.hs
bsd-3-clause
processGET :: HandlerInfo -> Bool -> Maybe Path -> IO RspSpec processGET hinfo ishtml rfile = tryGet hinfo ishtml <|> tryRedirect hinfo rfile <|> return notFound
222
processGET :: HandlerInfo -> Bool -> Maybe Path -> IO RspSpec processGET hinfo ishtml rfile = tryGet hinfo ishtml <|> tryRedirect hinfo rfile <|> return notFound
222
processGET hinfo ishtml rfile = tryGet hinfo ishtml <|> tryRedirect hinfo rfile <|> return notFound
160
false
true
0
8
86
57
26
31
null
null
jtdubs/Light
src/Light/Geometry/Matrix.hs
mit
(!*|) :: Normal -> Matrix -> Normal (Normal x y z) !*| (Matrix a b c _ e f g _ i j k _ _ _ _ _) = Normal (a*x+e*y+i*z) (b*x+f*y+j*z) (c*x+g*y+k*z)
148
(!*|) :: Normal -> Matrix -> Normal (Normal x y z) !*| (Matrix a b c _ e f g _ i j k _ _ _ _ _) = Normal (a*x+e*y+i*z) (b*x+f*y+j*z) (c*x+g*y+k*z)
148
(Normal x y z) !*| (Matrix a b c _ e f g _ i j k _ _ _ _ _) = Normal (a*x+e*y+i*z) (b*x+f*y+j*z) (c*x+g*y+k*z)
112
false
true
0
11
35
152
77
75
null
null
Yuras/plist
src/Text/XML/Plist/Write.hs
bsd-3-clause
objectToXml (PlInteger int) = selem "integer" [txt $ show int]
62
objectToXml (PlInteger int) = selem "integer" [txt $ show int]
62
objectToXml (PlInteger int) = selem "integer" [txt $ show int]
62
false
false
0
8
9
30
14
16
null
null
andorp/air
src/Air/Domain.hs
bsd-3-clause
payment :: Payment -> (Account, FlatBalance) -> (Account, FlatBalance) payment p (account, flat) = (userPayment p account, flatPayment p flat)
142
payment :: Payment -> (Account, FlatBalance) -> (Account, FlatBalance) payment p (account, flat) = (userPayment p account, flatPayment p flat)
142
payment p (account, flat) = (userPayment p account, flatPayment p flat)
71
false
true
0
7
19
63
33
30
null
null
jfischoff/simple-c-type-th
src/Language/C/Simple/CType/Build/TH.hs
bsd-3-clause
mk_c_type_con f typs (RecC name var_strict_types) = [| TStruct $(stringE $ show name) $(listE $ map (mk_var_strict_type_member f typs) var_strict_types) |]
157
mk_c_type_con f typs (RecC name var_strict_types) = [| TStruct $(stringE $ show name) $(listE $ map (mk_var_strict_type_member f typs) var_strict_types) |]
157
mk_c_type_con f typs (RecC name var_strict_types) = [| TStruct $(stringE $ show name) $(listE $ map (mk_var_strict_type_member f typs) var_strict_types) |]
157
false
false
0
7
22
24
13
11
null
null
JPMoresmau/ghcid
src/Test.hs
bsd-3-clause
tests :: TestTree tests = testGroup "Tests" [utilsTests ,parserTests ,apiTests ,ghcidTest ]
111
tests :: TestTree tests = testGroup "Tests" [utilsTests ,parserTests ,apiTests ,ghcidTest ]
111
tests = testGroup "Tests" [utilsTests ,parserTests ,apiTests ,ghcidTest ]
93
false
true
0
6
31
35
17
18
null
null
robdockins/edison
edison-core/src/Data/Edison/Coll/Defaults.hs
mit
insertSeqWithUsingInsertWith :: (Set c a,S.Sequence seq) => (a -> a -> a) -> seq a -> c -> c insertSeqWithUsingInsertWith c xs s = S.foldr (insertWith c) s xs
158
insertSeqWithUsingInsertWith :: (Set c a,S.Sequence seq) => (a -> a -> a) -> seq a -> c -> c insertSeqWithUsingInsertWith c xs s = S.foldr (insertWith c) s xs
158
insertSeqWithUsingInsertWith c xs s = S.foldr (insertWith c) s xs
65
false
true
0
9
28
78
39
39
null
null
kaizhang/haskell-igraph
src/IGraph.hs
mit
-- | Return the number of nodes in a graph. nNodes :: Graph d v e -> Int nNodes = unsafePerformIO . igraphVcount . _graph
121
nNodes :: Graph d v e -> Int nNodes = unsafePerformIO . igraphVcount . _graph
77
nNodes = unsafePerformIO . igraphVcount . _graph
48
true
true
0
6
24
31
16
15
null
null
rahulaaj/ML-Library
src/Linear/Linear.hs
gpl-3.0
addOne []=[]
12
addOne []=[]
12
addOne []=[]
12
false
false
0
6
1
13
6
7
null
null
haroldcarr/learn-haskell-coq-ml-etc
haskell/topic/general/wiki-haskell-org-99-questions/X99Questions.hs
unlicense
-- Problem 20 removeAt :: Int -> [a] -> (a, [a]) removeAt n xs = removeAt' n [] xs where removeAt' _ _ [] = error "n too big" removeAt' 1 acc (h:t) = (h, acc ++ t) removeAt' n acc (h:t) = removeAt' (n - 1) (h:acc) t
245
removeAt :: Int -> [a] -> (a, [a]) removeAt n xs = removeAt' n [] xs where removeAt' _ _ [] = error "n too big" removeAt' 1 acc (h:t) = (h, acc ++ t) removeAt' n acc (h:t) = removeAt' (n - 1) (h:acc) t
230
removeAt n xs = removeAt' n [] xs where removeAt' _ _ [] = error "n too big" removeAt' 1 acc (h:t) = (h, acc ++ t) removeAt' n acc (h:t) = removeAt' (n - 1) (h:acc) t
195
true
true
0
10
78
140
72
68
null
null
AndrewRademacher/zotac
test/Test/Data/Raft/Entry.hs
mit
entrySequenceFrom :: EntryReference -> Gen (Seq (Entry Int)) entrySequenceFrom ref = sized $ \size -> do elist <- entriesFromAsc ref return $ Seq.fromList $ List.take size elist -- | Generate a sequence of entries that is required to contain the -- provided entry, somewhere.
280
entrySequenceFrom :: EntryReference -> Gen (Seq (Entry Int)) entrySequenceFrom ref = sized $ \size -> do elist <- entriesFromAsc ref return $ Seq.fromList $ List.take size elist -- | Generate a sequence of entries that is required to contain the -- provided entry, somewhere.
280
entrySequenceFrom ref = sized $ \size -> do elist <- entriesFromAsc ref return $ Seq.fromList $ List.take size elist -- | Generate a sequence of entries that is required to contain the -- provided entry, somewhere.
219
false
true
0
12
48
79
37
42
null
null
sgillespie/ghc
compiler/hsSyn/HsUtils.hs
bsd-3-clause
{- ************************************************************************ * * Constructing syntax with no location info * * ************************************************************************ -} nlHsVar :: id -> LHsExpr id nlHsVar n = noLoc (HsVar (noLoc n))
412
nlHsVar :: id -> LHsExpr id nlHsVar n = noLoc (HsVar (noLoc n))
63
nlHsVar n = noLoc (HsVar (noLoc n))
35
true
true
0
9
173
37
18
19
null
null
apoorvingle/h-reversi
src/Game/Disc.hs
mit
isBlack = (== Black)
20
isBlack = (== Black)
20
isBlack = (== Black)
20
false
false
0
5
3
10
6
4
null
null
urbanslug/ghc
compiler/stgSyn/CoreToStg.hs
bsd-3-clause
singletonFVInfo :: Id -> HowBound -> StgBinderInfo -> FreeVarsInfo -- Don't record non-CAF imports at all, to keep free-var sets small singletonFVInfo id ImportBound info | mayHaveCafRefs (idCafInfo id) = unitVarEnv id (id, ImportBound, info) | otherwise = emptyVarEnv
294
singletonFVInfo :: Id -> HowBound -> StgBinderInfo -> FreeVarsInfo singletonFVInfo id ImportBound info | mayHaveCafRefs (idCafInfo id) = unitVarEnv id (id, ImportBound, info) | otherwise = emptyVarEnv
226
singletonFVInfo id ImportBound info | mayHaveCafRefs (idCafInfo id) = unitVarEnv id (id, ImportBound, info) | otherwise = emptyVarEnv
159
true
true
1
10
64
73
35
38
null
null
frontrowed/stratosphere
library-gen/Stratosphere/ResourceProperties/AutoScalingPlansScalingPlanPredefinedScalingMetricSpecification.hs
mit
-- | http://docs.aws.amazon.com/AWSCloudFormation/latest/UserGuide/aws-properties-autoscalingplans-scalingplan-predefinedscalingmetricspecification.html#cfn-autoscalingplans-scalingplan-predefinedscalingmetricspecification-resourcelabel aspsppsmsResourceLabel :: Lens' AutoScalingPlansScalingPlanPredefinedScalingMetricSpecification (Maybe (Val Text)) aspsppsmsResourceLabel = lens _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel (\s a -> s { _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel = a })
557
aspsppsmsResourceLabel :: Lens' AutoScalingPlansScalingPlanPredefinedScalingMetricSpecification (Maybe (Val Text)) aspsppsmsResourceLabel = lens _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel (\s a -> s { _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel = a })
320
aspsppsmsResourceLabel = lens _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel (\s a -> s { _autoScalingPlansScalingPlanPredefinedScalingMetricSpecificationResourceLabel = a })
205
true
true
1
9
22
57
28
29
null
null
DougBurke/swish
tests/VarBindingTest.hs
lgpl-2.1
-- 1 jcompae = findComposition [vbm3,vbm4,vbm9] ["a","e"]
57
jcompae = findComposition [vbm3,vbm4,vbm9] ["a","e"]
52
jcompae = findComposition [vbm3,vbm4,vbm9] ["a","e"]
52
true
false
0
6
6
27
16
11
null
null
GaloisInc/pads-haskell
Examples/First.hs
bsd-3-clause
input_digitListTermSepG = "1|2|3|4|5|6;hello"
45
input_digitListTermSepG = "1|2|3|4|5|6;hello"
45
input_digitListTermSepG = "1|2|3|4|5|6;hello"
45
false
false
0
4
2
6
3
3
null
null
gcampax/ghc
compiler/typecheck/TcRnTypes.hs
bsd-3-clause
pushErrCtxtSameOrigin :: ErrCtxt -> CtLoc -> CtLoc -- Just add information w/o updating the origin! pushErrCtxtSameOrigin err loc@(CtLoc { ctl_env = lcl }) = loc { ctl_env = lcl { tcl_ctxt = err : tcl_ctxt lcl } }
215
pushErrCtxtSameOrigin :: ErrCtxt -> CtLoc -> CtLoc pushErrCtxtSameOrigin err loc@(CtLoc { ctl_env = lcl }) = loc { ctl_env = lcl { tcl_ctxt = err : tcl_ctxt lcl } }
166
pushErrCtxtSameOrigin err loc@(CtLoc { ctl_env = lcl }) = loc { ctl_env = lcl { tcl_ctxt = err : tcl_ctxt lcl } }
115
true
true
0
10
39
63
35
28
null
null
alphalambda/codeworld
codeworld-compiler/src/CodeWorld/Compile/Stages.hs
apache-2.0
isGoodExpAppRhs (List _ _) = True
33
isGoodExpAppRhs (List _ _) = True
33
isGoodExpAppRhs (List _ _) = True
33
false
false
0
7
5
17
8
9
null
null
Dr-Horv/Advent-of-code
day15/day15.hs
mit
main :: IO () main = do ls <- readInputLines "input.txt" let ingredients = map parseLine ls let scores = map fst $ filter (\(_, cal) -> cal == 500) $ map (calculateScoreOfCombination ingredients) getCombinations print $ maximum scores
252
main :: IO () main = do ls <- readInputLines "input.txt" let ingredients = map parseLine ls let scores = map fst $ filter (\(_, cal) -> cal == 500) $ map (calculateScoreOfCombination ingredients) getCombinations print $ maximum scores
252
main = do ls <- readInputLines "input.txt" let ingredients = map parseLine ls let scores = map fst $ filter (\(_, cal) -> cal == 500) $ map (calculateScoreOfCombination ingredients) getCombinations print $ maximum scores
238
false
true
0
15
56
102
48
54
null
null
chwthewke/horbits
src/horbits/Horbits/Orbit/Properties.hs
bsd-3-clause
-- AP _apoapsis :: OrbitClass t => t -> Length Double _apoapsis = do p <- view orbitSemiLatusRectum e <- view orbitEccentricity return $ p / (_1 - e)
162
_apoapsis :: OrbitClass t => t -> Length Double _apoapsis = do p <- view orbitSemiLatusRectum e <- view orbitEccentricity return $ p / (_1 - e)
155
_apoapsis = do p <- view orbitSemiLatusRectum e <- view orbitEccentricity return $ p / (_1 - e)
107
true
true
0
10
41
70
31
39
null
null
Kotolegokot/Underlisp
src/Lib/IO.hs
gpl-3.0
biFlush _ _ = reportE' "no arguments required"
47
biFlush _ _ = reportE' "no arguments required"
47
biFlush _ _ = reportE' "no arguments required"
47
false
false
1
5
8
14
6
8
null
null
ndmitchell/shake
src/Test/Type.hs
bsd-3-clause
removeFilesRandom :: FilePath -> IO Int removeFilesRandom x = do files <- getDirectoryContentsRecursive x n <- randomRIO (0,length files) rs <- replicateM (length files) (randomIO :: IO Double) mapM_ (removeFile . snd) $ sort $ zip rs files pure n
267
removeFilesRandom :: FilePath -> IO Int removeFilesRandom x = do files <- getDirectoryContentsRecursive x n <- randomRIO (0,length files) rs <- replicateM (length files) (randomIO :: IO Double) mapM_ (removeFile . snd) $ sort $ zip rs files pure n
267
removeFilesRandom x = do files <- getDirectoryContentsRecursive x n <- randomRIO (0,length files) rs <- replicateM (length files) (randomIO :: IO Double) mapM_ (removeFile . snd) $ sort $ zip rs files pure n
227
false
true
0
11
59
109
50
59
null
null
urbanslug/cs194
Src/Week3/BST.hs
gpl-3.0
-- | Get a list of the elements in sorted order getElements :: BST a -> [a] getElements Leaf = []
112
getElements :: BST a -> [a] getElements Leaf = []
64
getElements Leaf = []
36
true
true
0
6
35
27
14
13
null
null
copumpkin/vector-static
Data/Vector/Static.hs
bsd-3-clause
head (Vec vs) = G.head vs
25
head (Vec vs) = G.head vs
25
head (Vec vs) = G.head vs
25
false
false
0
7
5
20
9
11
null
null
dlgd/monoid-average
src/MonoidAverage.hs
bsd-3-clause
getAverage :: Fractional a => Average a -> Maybe a getAverage (Average n a) | n == 0 = Nothing | otherwise = Just $ a / fromIntegral n
159
getAverage :: Fractional a => Average a -> Maybe a getAverage (Average n a) | n == 0 = Nothing | otherwise = Just $ a / fromIntegral n
159
getAverage (Average n a) | n == 0 = Nothing | otherwise = Just $ a / fromIntegral n
108
false
true
0
8
53
69
31
38
null
null
junjihashimoto/yesod-raml
yesod-raml-bin/main.hs
mit
runCmd (Verify file) = do v <- Y.decodeFileEither file :: IO (Either Y.ParseException Raml) print v
103
runCmd (Verify file) = do v <- Y.decodeFileEither file :: IO (Either Y.ParseException Raml) print v
103
runCmd (Verify file) = do v <- Y.decodeFileEither file :: IO (Either Y.ParseException Raml) print v
103
false
false
0
11
19
49
22
27
null
null
Javran/haptics
src/Trace/Haptics/Report.hs
bsd-3-clause
report_main :: Flags -> [String] -> IO () report_main hpcflags (progName : mods) = do let hpcflags1 = hpcflags { includeMods = Set.fromList mods `Set.union` includeMods hpcflags } let prog = getTixFileName $ progName tix <- readTix prog case tix of Just (Tix tickCounts) -> makeReport hpcflags1 progName $ sortBy (\mod1 mod2 -> tixModuleName mod1 `compare` tixModuleName mod2) $ [ tix' | tix'@(TixModule m _ _ _) <- tickCounts , allowModule hpcflags1 m ] Nothing -> hpcError report_plugin $ "unable to find tix file for:" ++ progName
661
report_main :: Flags -> [String] -> IO () report_main hpcflags (progName : mods) = do let hpcflags1 = hpcflags { includeMods = Set.fromList mods `Set.union` includeMods hpcflags } let prog = getTixFileName $ progName tix <- readTix prog case tix of Just (Tix tickCounts) -> makeReport hpcflags1 progName $ sortBy (\mod1 mod2 -> tixModuleName mod1 `compare` tixModuleName mod2) $ [ tix' | tix'@(TixModule m _ _ _) <- tickCounts , allowModule hpcflags1 m ] Nothing -> hpcError report_plugin $ "unable to find tix file for:" ++ progName
661
report_main hpcflags (progName : mods) = do let hpcflags1 = hpcflags { includeMods = Set.fromList mods `Set.union` includeMods hpcflags } let prog = getTixFileName $ progName tix <- readTix prog case tix of Just (Tix tickCounts) -> makeReport hpcflags1 progName $ sortBy (\mod1 mod2 -> tixModuleName mod1 `compare` tixModuleName mod2) $ [ tix' | tix'@(TixModule m _ _ _) <- tickCounts , allowModule hpcflags1 m ] Nothing -> hpcError report_plugin $ "unable to find tix file for:" ++ progName
619
false
true
0
17
214
213
103
110
null
null
utky/lambda-cute
src/Language/Lambda/Parser.hs
bsd-3-clause
showMessage (Expect m) = m ++ "\n"
39
showMessage (Expect m) = m ++ "\n"
39
showMessage (Expect m) = m ++ "\n"
39
false
false
0
7
11
19
9
10
null
null
forked-upstream-packages-for-ghcjs/ghc
compiler/typecheck/TcEvidence.hs
bsd-3-clause
mkWpLet :: TcEvBinds -> HsWrapper -- This no-op is a quite a common case mkWpLet (EvBinds b) | isEmptyBag b = WpHole
116
mkWpLet :: TcEvBinds -> HsWrapper mkWpLet (EvBinds b) | isEmptyBag b = WpHole
77
mkWpLet (EvBinds b) | isEmptyBag b = WpHole
43
true
true
0
8
21
34
16
18
null
null
bergmark/haskell-opaleye
src/Opaleye/Internal/Print.hs
bsd-3-clause
ppSelectBinary :: Binary -> Doc ppSelectBinary b = ppSql (Sql.bSelect1 b) $$ ppBinOp (Sql.bOp b) $$ ppSql (Sql.bSelect2 b)
160
ppSelectBinary :: Binary -> Doc ppSelectBinary b = ppSql (Sql.bSelect1 b) $$ ppBinOp (Sql.bOp b) $$ ppSql (Sql.bSelect2 b)
160
ppSelectBinary b = ppSql (Sql.bSelect1 b) $$ ppBinOp (Sql.bOp b) $$ ppSql (Sql.bSelect2 b)
128
false
true
0
10
56
59
28
31
null
null
forste/haReFork
tools/hs2isabelle/Prop2Isabelle.hs
bsd-3-clause
addConstsDecls table (x:xs) = case x of IsaFixrec d -> IsaConsts (fixrec2consts table d) : x : addConstsDecls table xs _ -> x : addConstsDecls table xs ------------------------------------------------------------ --transPat :: PrintableOp i => HsPatI i -> P
273
addConstsDecls table (x:xs) = case x of IsaFixrec d -> IsaConsts (fixrec2consts table d) : x : addConstsDecls table xs _ -> x : addConstsDecls table xs ------------------------------------------------------------ --transPat :: PrintableOp i => HsPatI i -> P
273
addConstsDecls table (x:xs) = case x of IsaFixrec d -> IsaConsts (fixrec2consts table d) : x : addConstsDecls table xs _ -> x : addConstsDecls table xs ------------------------------------------------------------ --transPat :: PrintableOp i => HsPatI i -> P
273
false
false
0
12
52
73
35
38
null
null
wavewave/lhc-analysis-collection
heavyhiggs/combine2.hs
gpl-3.0
get14 (_,_,_,_,_,_,_,_,_,_,_,_,_,a,_,_) = a
43
get14 (_,_,_,_,_,_,_,_,_,_,_,_,_,a,_,_) = a
43
get14 (_,_,_,_,_,_,_,_,_,_,_,_,_,a,_,_) = a
43
false
false
0
5
3
58
36
22
null
null
bixuanzju/fcore
lib/simplify/SimplifyImpl.hs
bsd-2-clause
getter :: Index -> Index -> FI.Type Index -> S.Label -> Maybe (FI.Type Index, Expr Index Index) getter i j this@(FI.RecordType (l, t)) l1 | l1 == l = return $ (t, lam (transType i this) var) | otherwise = Nothing
216
getter :: Index -> Index -> FI.Type Index -> S.Label -> Maybe (FI.Type Index, Expr Index Index) getter i j this@(FI.RecordType (l, t)) l1 | l1 == l = return $ (t, lam (transType i this) var) | otherwise = Nothing
216
getter i j this@(FI.RecordType (l, t)) l1 | l1 == l = return $ (t, lam (transType i this) var) | otherwise = Nothing
120
false
true
9
8
44
118
62
56
null
null
horia141/bachelor-thesis
dev/MemGen/Main.hs
mit
veriNumber Str wordSize string = show string
44
veriNumber Str wordSize string = show string
44
veriNumber Str wordSize string = show string
44
false
false
0
5
6
18
7
11
null
null
msakai/icfpc2014
GHostCPU.hs
bsd-3-clause
execAdd _ _ = error "Not ADD"
29
execAdd _ _ = error "Not ADD"
29
execAdd _ _ = error "Not ADD"
29
false
false
0
5
6
14
6
8
null
null
vdweegen/UvA-Software_Testing
Lab5/Final/Lecture5'.hs
gpl-3.0
example3 :: Grid example3 = [[1,0,0,0,3,0,5,0,4], [0,0,0,0,0,0,0,0,3], [0,0,2,0,0,5,0,9,8], [0,0,9,0,0,0,0,3,0], [2,0,0,0,0,0,0,0,7], [8,0,3,0,9,1,0,6,0], [0,5,1,4,7,0,0,0,0], [0,0,0,3,0,0,0,0,0], [0,4,0,0,0,9,7,0,0]]
313
example3 :: Grid example3 = [[1,0,0,0,3,0,5,0,4], [0,0,0,0,0,0,0,0,3], [0,0,2,0,0,5,0,9,8], [0,0,9,0,0,0,0,3,0], [2,0,0,0,0,0,0,0,7], [8,0,3,0,9,1,0,6,0], [0,5,1,4,7,0,0,0,0], [0,0,0,3,0,0,0,0,0], [0,4,0,0,0,9,7,0,0]]
313
example3 = [[1,0,0,0,3,0,5,0,4], [0,0,0,0,0,0,0,0,3], [0,0,2,0,0,5,0,9,8], [0,0,9,0,0,0,0,3,0], [2,0,0,0,0,0,0,0,7], [8,0,3,0,9,1,0,6,0], [0,5,1,4,7,0,0,0,0], [0,0,0,3,0,0,0,0,0], [0,4,0,0,0,9,7,0,0]]
296
false
true
0
7
109
288
187
101
null
null
blast-hardcheese/talk-haskell-logparse
src/Main.hs
mit
contains :: String -> LogMessage -> Bool contains x (LogMessage _ _ m) = x `isInfixOf` m
88
contains :: String -> LogMessage -> Bool contains x (LogMessage _ _ m) = x `isInfixOf` m
88
contains x (LogMessage _ _ m) = x `isInfixOf` m
47
false
true
0
10
16
46
22
24
null
null
silkapp/xmlhtml
src/Text/XmlHtml/XML/Render.hs
bsd-3-clause
element e t a c = fromText e "<" `mappend` fromText e t `mappend` (mconcat $ map (attribute e) a) `mappend` fromText e ">" `mappend` (mconcat $ map (node e) c) `mappend` fromText e "</" `mappend` fromText e t `mappend` fromText e ">"
289
element e t a c = fromText e "<" `mappend` fromText e t `mappend` (mconcat $ map (attribute e) a) `mappend` fromText e ">" `mappend` (mconcat $ map (node e) c) `mappend` fromText e "</" `mappend` fromText e t `mappend` fromText e ">"
289
element e t a c = fromText e "<" `mappend` fromText e t `mappend` (mconcat $ map (attribute e) a) `mappend` fromText e ">" `mappend` (mconcat $ map (node e) c) `mappend` fromText e "</" `mappend` fromText e t `mappend` fromText e ">"
289
false
false
1
10
98
150
72
78
null
null
mikehat/blaze-css
src/Text/Blaze/Css21/Value.hs
bsd-3-clause
to_string TableRow = "table-row"
46
to_string TableRow = "table-row"
46
to_string TableRow = "table-row"
46
false
false
0
5
17
9
4
5
null
null
DaMSL/K3
src/Language/K3/Interpreter/Values.hs
apache-2.0
-- | Interpreter implementations of equality and comparison functions. -- Since these operate in the interpretation monad, these can perform side-effects, -- for example, to compare external dataspaces. valueEq :: Value -> Value -> Interpretation Value valueEq a b = valueCompare a b >>= asBool where asBool (VInt sgn) = return . VBool $ sgn == 0 asBool _ = throwE $ RunTimeInterpretationError "Invalid comparison value in equality test"
460
valueEq :: Value -> Value -> Interpretation Value valueEq a b = valueCompare a b >>= asBool where asBool (VInt sgn) = return . VBool $ sgn == 0 asBool _ = throwE $ RunTimeInterpretationError "Invalid comparison value in equality test"
253
valueEq a b = valueCompare a b >>= asBool where asBool (VInt sgn) = return . VBool $ sgn == 0 asBool _ = throwE $ RunTimeInterpretationError "Invalid comparison value in equality test"
203
true
true
0
8
91
89
42
47
null
null
aycanirican/network-transport-tcp
src/Network/Transport/TCP.hs
bsd-3-clause
elog :: EndPointPair -> String -> IO () elog (ourEndPoint, theirEndPoint) msg = do tid <- myThreadId putStrLn $ show (localAddress ourEndPoint) ++ "/" ++ show (remoteAddress theirEndPoint) ++ "(" ++ show (remoteId theirEndPoint) ++ ")" ++ "/" ++ show tid ++ ": " ++ msg
294
elog :: EndPointPair -> String -> IO () elog (ourEndPoint, theirEndPoint) msg = do tid <- myThreadId putStrLn $ show (localAddress ourEndPoint) ++ "/" ++ show (remoteAddress theirEndPoint) ++ "(" ++ show (remoteId theirEndPoint) ++ ")" ++ "/" ++ show tid ++ ": " ++ msg
294
elog (ourEndPoint, theirEndPoint) msg = do tid <- myThreadId putStrLn $ show (localAddress ourEndPoint) ++ "/" ++ show (remoteAddress theirEndPoint) ++ "(" ++ show (remoteId theirEndPoint) ++ ")" ++ "/" ++ show tid ++ ": " ++ msg
254
false
true
0
19
70
115
55
60
null
null
FranklinChen/hugs98-plus-Sep2006
packages/GLUT/Graphics/UI/GLUT/Constants.hs
bsd-3-clause
----------------------------------------------------------------------------- -- * Menu usage state glut_MENU_NOT_IN_USE, glut_MENU_IN_USE :: CInt glut_MENU_NOT_IN_USE = 0
189
glut_MENU_NOT_IN_USE, glut_MENU_IN_USE :: CInt glut_MENU_NOT_IN_USE = 0
89
glut_MENU_NOT_IN_USE = 0
42
true
true
0
4
30
15
10
5
null
null
aBhallo/AoC2016
Day 8/day8part2.hs
mit
main = do contents <- readFile "day8input.txt" let result = compute $ lines contents printScreen result
129
main = do contents <- readFile "day8input.txt" let result = compute $ lines contents printScreen result
129
main = do contents <- readFile "day8input.txt" let result = compute $ lines contents printScreen result
129
false
false
0
11
41
38
16
22
null
null
alexander-at-github/eta
libraries/base/Foreign/C/Error.hs
bsd-3-clause
eNOLINK = Errno (CONST_ENOLINK)
39
eNOLINK = Errno (CONST_ENOLINK)
39
eNOLINK = Errno (CONST_ENOLINK)
39
false
false
0
6
11
12
6
6
null
null
mimi1vx/shellcheck
ShellCheck/Analytics.hs
gpl-3.0
prop_checkSingleQuotedVariables3a= verify checkSingleQuotedVariables "sed 's/${foo}/bar/'"
90
prop_checkSingleQuotedVariables3a= verify checkSingleQuotedVariables "sed 's/${foo}/bar/'"
90
prop_checkSingleQuotedVariables3a= verify checkSingleQuotedVariables "sed 's/${foo}/bar/'"
90
false
false
1
5
4
15
5
10
null
null
Mathnerd314/lamdu
bottlelib/Graphics/UI/Bottle/Widgets/FlyNav.hs
gpl-3.0
speed :: Vector2 Widget.R speed = 8
35
speed :: Vector2 Widget.R speed = 8
35
speed = 8
9
false
true
0
7
6
22
9
13
null
null
brendanhay/gogol
gogol-bigquerydatatransfer/gen/Network/Google/Resource/BigQueryDataTransfer/Projects/TransferConfigs/Delete.hs
mpl-2.0
-- | Creates a value of 'ProjectsTransferConfigsDelete' with the minimum fields required to make a request. -- -- Use one of the following lenses to modify other fields as desired: -- -- * 'ptcdXgafv' -- -- * 'ptcdUploadProtocol' -- -- * 'ptcdAccessToken' -- -- * 'ptcdUploadType' -- -- * 'ptcdName' -- -- * 'ptcdCallback' projectsTransferConfigsDelete :: Text -- ^ 'ptcdName' -> ProjectsTransferConfigsDelete projectsTransferConfigsDelete pPtcdName_ = ProjectsTransferConfigsDelete' { _ptcdXgafv = Nothing , _ptcdUploadProtocol = Nothing , _ptcdAccessToken = Nothing , _ptcdUploadType = Nothing , _ptcdName = pPtcdName_ , _ptcdCallback = Nothing }
686
projectsTransferConfigsDelete :: Text -- ^ 'ptcdName' -> ProjectsTransferConfigsDelete projectsTransferConfigsDelete pPtcdName_ = ProjectsTransferConfigsDelete' { _ptcdXgafv = Nothing , _ptcdUploadProtocol = Nothing , _ptcdAccessToken = Nothing , _ptcdUploadType = Nothing , _ptcdName = pPtcdName_ , _ptcdCallback = Nothing }
363
projectsTransferConfigsDelete pPtcdName_ = ProjectsTransferConfigsDelete' { _ptcdXgafv = Nothing , _ptcdUploadProtocol = Nothing , _ptcdAccessToken = Nothing , _ptcdUploadType = Nothing , _ptcdName = pPtcdName_ , _ptcdCallback = Nothing }
268
true
true
0
7
128
81
52
29
null
null
RefactoringTools/HaRe
old/testing/introThreshold/DeepSeq2_TokOut.hs
bsd-3-clause
fib t n | n <= 1 = 1 | otherwise = n1_2 + n2_2 + 1 where n1 = fib 20 (n-1) n2 = fib 20 (n-2) (n1_2, n2_2) = CP.runEval (do n1_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n1 n2_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n2 return (n1_2, n2_2)) where rpar_abs_1 | n > t = CP.rpar | otherwise = CP.rseq
459
fib t n | n <= 1 = 1 | otherwise = n1_2 + n2_2 + 1 where n1 = fib 20 (n-1) n2 = fib 20 (n-2) (n1_2, n2_2) = CP.runEval (do n1_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n1 n2_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n2 return (n1_2, n2_2)) where rpar_abs_1 | n > t = CP.rpar | otherwise = CP.rseq
459
fib t n | n <= 1 = 1 | otherwise = n1_2 + n2_2 + 1 where n1 = fib 20 (n-1) n2 = fib 20 (n-2) (n1_2, n2_2) = CP.runEval (do n1_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n1 n2_2 <- (rpar_abs_1 `CP.dot` CP.rdeepseq) n2 return (n1_2, n2_2)) where rpar_abs_1 | n > t = CP.rpar | otherwise = CP.rseq
459
false
false
1
15
228
182
91
91
null
null
sdiehl/ghc
testsuite/tests/codeGen/should_run/T16846.hs
bsd-3-clause
main = runWidget $ comb $ replicate 10000000 (effect retry)
59
main = runWidget $ comb $ replicate 10000000 (effect retry)
59
main = runWidget $ comb $ replicate 10000000 (effect retry)
59
false
false
0
8
9
25
12
13
null
null
mikeplus64/indices
tests/Tests.hs
mit
main :: IO () main = exitWith . boolExit =<< $quickCheckAll where boolExit True = ExitSuccess boolExit False = ExitFailure 0
130
main :: IO () main = exitWith . boolExit =<< $quickCheckAll where boolExit True = ExitSuccess boolExit False = ExitFailure 0
130
main = exitWith . boolExit =<< $quickCheckAll where boolExit True = ExitSuccess boolExit False = ExitFailure 0
116
false
true
3
7
26
59
23
36
null
null
GaloisInc/ivory-rtverification
rtv-lib/src/Ivory/RTVerification/Operators.hs
bsd-3-clause
historically :: (IvoryVar a) => [Getter a] -> Predicate a -> CheckersState () historically getters predicate = do propsState <- get let prevResId = "historically_prev" ++ (show . nextId) propsState let prev_res = area prevResId (Just (ival true)) :: MemArea (Stored IBool) let test = body $ do currVals <- mapM (flip call 0) getters let prev = addrOf prev_res prev' <- deref prev -- if the previous test failed, return false right away; -- otherwise, store the result of this check and return -- its result flip (ifte_ prev') (ret false) $ do let res = predicate currVals store prev res ret prev' set (propsState { functions = test: functions propsState , globals = prev_res: globals propsState , nextId = succ $ nextId propsState }) -- | Takes a list of 'Getter's and a predicate and generates a checker function -- that checks that the predicate was true at time t-1.
987
historically :: (IvoryVar a) => [Getter a] -> Predicate a -> CheckersState () historically getters predicate = do propsState <- get let prevResId = "historically_prev" ++ (show . nextId) propsState let prev_res = area prevResId (Just (ival true)) :: MemArea (Stored IBool) let test = body $ do currVals <- mapM (flip call 0) getters let prev = addrOf prev_res prev' <- deref prev -- if the previous test failed, return false right away; -- otherwise, store the result of this check and return -- its result flip (ifte_ prev') (ret false) $ do let res = predicate currVals store prev res ret prev' set (propsState { functions = test: functions propsState , globals = prev_res: globals propsState , nextId = succ $ nextId propsState }) -- | Takes a list of 'Getter's and a predicate and generates a checker function -- that checks that the predicate was true at time t-1.
987
historically getters predicate = do propsState <- get let prevResId = "historically_prev" ++ (show . nextId) propsState let prev_res = area prevResId (Just (ival true)) :: MemArea (Stored IBool) let test = body $ do currVals <- mapM (flip call 0) getters let prev = addrOf prev_res prev' <- deref prev -- if the previous test failed, return false right away; -- otherwise, store the result of this check and return -- its result flip (ifte_ prev') (ret false) $ do let res = predicate currVals store prev res ret prev' set (propsState { functions = test: functions propsState , globals = prev_res: globals propsState , nextId = succ $ nextId propsState }) -- | Takes a list of 'Getter's and a predicate and generates a checker function -- that checks that the predicate was true at time t-1.
909
false
true
0
20
269
276
131
145
null
null
urbanslug/ghc
includes/CodeGen.Platform.hs
bsd-3-clause
freeReg rsp = fastBool False
28
freeReg rsp = fastBool False
28
freeReg rsp = fastBool False
28
false
false
0
5
4
12
5
7
null
null
mgmeier/mysql-simple
Database/MySQL/Simple/Result.hs
bsd-3-clause
ok16 = mkCompats [Tiny,Short]
29
ok16 = mkCompats [Tiny,Short]
29
ok16 = mkCompats [Tiny,Short]
29
false
false
1
6
3
18
8
10
null
null
archdragon/haskell_exercises
fizz_buzz/fizz_buzz.hs
mit
main = do putStrLn "Fizzbuzz 3:" putStrLn $ fizzbuzz 3 putStrLn "Fizzbuzz 5:" putStrLn $ fizzbuzz 5 putStrLn "Fizzbuzz 15:" putStrLn $ fizzbuzz 15 putStrLn "Fizzbuzz 50:" putStrLn $ fizzbuzz 50 putStrLn "Fizzbuzz 113:" putStrLn $ fizzbuzz 113
262
main = do putStrLn "Fizzbuzz 3:" putStrLn $ fizzbuzz 3 putStrLn "Fizzbuzz 5:" putStrLn $ fizzbuzz 5 putStrLn "Fizzbuzz 15:" putStrLn $ fizzbuzz 15 putStrLn "Fizzbuzz 50:" putStrLn $ fizzbuzz 50 putStrLn "Fizzbuzz 113:" putStrLn $ fizzbuzz 113
262
main = do putStrLn "Fizzbuzz 3:" putStrLn $ fizzbuzz 3 putStrLn "Fizzbuzz 5:" putStrLn $ fizzbuzz 5 putStrLn "Fizzbuzz 15:" putStrLn $ fizzbuzz 15 putStrLn "Fizzbuzz 50:" putStrLn $ fizzbuzz 50 putStrLn "Fizzbuzz 113:" putStrLn $ fizzbuzz 113
262
false
false
1
9
57
90
33
57
null
null
SimSaladin/rnfssp
rnfssp-util/Utils.hs
bsd-3-clause
submitButtonI :: RenderMessage master msg => msg -> WidgetT master IO () submitButtonI x = [whamlet|<input type=submit value=_{x}>|]
146
submitButtonI :: RenderMessage master msg => msg -> WidgetT master IO () submitButtonI x = [whamlet|<input type=submit value=_{x}>|]
146
submitButtonI x = [whamlet|<input type=submit value=_{x}>|]
59
false
true
0
8
31
40
21
19
null
null
ezyang/ghc
compiler/parser/HaddockUtils.hs
bsd-3-clause
addFieldDocs :: [LConDeclField a] -> Maybe LHsDocString -> [LConDeclField a] addFieldDocs [] _ = []
99
addFieldDocs :: [LConDeclField a] -> Maybe LHsDocString -> [LConDeclField a] addFieldDocs [] _ = []
99
addFieldDocs [] _ = []
22
false
true
0
8
14
48
22
26
null
null
dirkz/google-code-jam-haskell
practice/src/Milkshakes.hs
mpl-2.0
main = run
10
main = run
10
main = run
10
false
false
0
4
2
6
3
3
null
null
NickAger/LearningHaskell
HaskellProgrammingFromFirstPrinciples/Chapter21.hsproj/MorseCodeRevisited.hs
mit
letterToMorse :: (M.Map Char Morse) letterToMorse = M.fromList [ ('a', ".-") , ('b', "-...") , ('c', "-.-.") , ('d', "-..") , ('e', ".") , ('f', "..-.") , ('g', "--.") , ('h', "....") , ('i', "..") , ('j', ".---") , ('k', "-.-") , ('l', ".-..") , ('m', "--") , ('n', "-.") , ('o', "---") , ('p', ".--.") , ('q', "--.-") , ('r', ".-.") , ('s', "...") , ('t', "-") , ('u', "..-") , ('v', "...-") , ('w', ".--") , ('x', "-..-") , ('y', "-.--") , ('z', "--..") , ('1', ".----") , ('2', "..---") , ('3', "...--") , ('4', "....-") , ('5', ".....") , ('6', "-....") , ('7', "--...") , ('8', "---..") , ('9', "----.") , ('0', "-----") ]
703
letterToMorse :: (M.Map Char Morse) letterToMorse = M.fromList [ ('a', ".-") , ('b', "-...") , ('c', "-.-.") , ('d', "-..") , ('e', ".") , ('f', "..-.") , ('g', "--.") , ('h', "....") , ('i', "..") , ('j', ".---") , ('k', "-.-") , ('l', ".-..") , ('m', "--") , ('n', "-.") , ('o', "---") , ('p', ".--.") , ('q', "--.-") , ('r', ".-.") , ('s', "...") , ('t', "-") , ('u', "..-") , ('v', "...-") , ('w', ".--") , ('x', "-..-") , ('y', "-.--") , ('z', "--..") , ('1', ".----") , ('2', "..---") , ('3', "...--") , ('4', "....-") , ('5', ".....") , ('6', "-....") , ('7', "--...") , ('8', "---..") , ('9', "----.") , ('0', "-----") ]
703
letterToMorse = M.fromList [ ('a', ".-") , ('b', "-...") , ('c', "-.-.") , ('d', "-..") , ('e', ".") , ('f', "..-.") , ('g', "--.") , ('h', "....") , ('i', "..") , ('j', ".---") , ('k', "-.-") , ('l', ".-..") , ('m', "--") , ('n', "-.") , ('o', "---") , ('p', ".--.") , ('q', "--.-") , ('r', ".-.") , ('s', "...") , ('t', "-") , ('u', "..-") , ('v', "...-") , ('w', ".--") , ('x', "-..-") , ('y', "-.--") , ('z', "--..") , ('1', ".----") , ('2', "..---") , ('3', "...--") , ('4', "....-") , ('5', ".....") , ('6', "-....") , ('7', "--...") , ('8', "---..") , ('9', "----.") , ('0', "-----") ]
667
false
true
0
7
191
350
229
121
null
null
glguy/ssh-hans
src/Network/SSH/Messages.hs
bsd-3-clause
sshPubCertName SshPubRsa {} = "ssh-rsa"
45
sshPubCertName SshPubRsa {} = "ssh-rsa"
45
sshPubCertName SshPubRsa {} = "ssh-rsa"
45
false
false
1
5
10
15
6
9
null
null
faylang/fay-server
src/Language/Fay/JQuery.hs
bsd-3-clause
selectEmpty :: Fay JQuery selectEmpty = ffi "window['jQuery']()"
64
selectEmpty :: Fay JQuery selectEmpty = ffi "window['jQuery']()"
64
selectEmpty = ffi "window['jQuery']()"
38
false
true
0
5
7
17
8
9
null
null
shayan-najd/QFeldspar
Tests/GADTTyped.hs
gpl-3.0
compose :: TA.Typ -> TA.Typ -> Exp n m TA.Typ compose ta tb = Abs (Abs (Abs (App tb (Var (Suc (Suc Zro))) (App ta (Var (Suc Zro)) (Var Zro)))))
148
compose :: TA.Typ -> TA.Typ -> Exp n m TA.Typ compose ta tb = Abs (Abs (Abs (App tb (Var (Suc (Suc Zro))) (App ta (Var (Suc Zro)) (Var Zro)))))
148
compose ta tb = Abs (Abs (Abs (App tb (Var (Suc (Suc Zro))) (App ta (Var (Suc Zro)) (Var Zro)))))
102
false
true
0
17
34
108
53
55
null
null
phadej/base-orphans
test/Data/Version/OrphansSpec.hs
mit
spec :: Spec spec = do describe "Data Version instance" $ it "allows obtaining a Version constructor" $ dataTypeName (dataTypeOf (Version [1,2,3] [])) `shouldBe` "Data.Version.Version" #if MIN_VERSION_base(4,7,0) describe "IsList Version instance" $ it "creates a Version from an Int list" $ [1,2,3] `shouldBe` Version [1,2,3] [] #endif
361
spec :: Spec spec = do describe "Data Version instance" $ it "allows obtaining a Version constructor" $ dataTypeName (dataTypeOf (Version [1,2,3] [])) `shouldBe` "Data.Version.Version" #if MIN_VERSION_base(4,7,0) describe "IsList Version instance" $ it "creates a Version from an Int list" $ [1,2,3] `shouldBe` Version [1,2,3] [] #endif
361
spec = do describe "Data Version instance" $ it "allows obtaining a Version constructor" $ dataTypeName (dataTypeOf (Version [1,2,3] [])) `shouldBe` "Data.Version.Version" #if MIN_VERSION_base(4,7,0) describe "IsList Version instance" $ it "creates a Version from an Int list" $ [1,2,3] `shouldBe` Version [1,2,3] [] #endif
348
false
true
0
14
71
112
60
52
null
null
d0kt0r0/Tidal
src/Sound/Tidal/old/Dirt.hs
gpl-3.0
striateO :: Pattern Int -> Pattern Double -> ParamPattern -> ParamPattern striateO = temporalParam2 _striateO
109
striateO :: Pattern Int -> Pattern Double -> ParamPattern -> ParamPattern striateO = temporalParam2 _striateO
109
striateO = temporalParam2 _striateO
35
false
true
0
7
14
32
15
17
null
null
mhlakhani/hlisp
src/Builtins.hs
mit
makeNotCallableError :: LispVal -> LispVal makeNotCallableError name = LispError $ NotCallable name
99
makeNotCallableError :: LispVal -> LispVal makeNotCallableError name = LispError $ NotCallable name
99
makeNotCallableError name = LispError $ NotCallable name
56
false
true
0
6
11
25
12
13
null
null