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
wereHamster/nauva
pkg/hs/nauva/src/Nauva/View/Terms.hs
mit
base_ :: [Attribute] -> Element base_ = with (ENode "base" [] [])
65
base_ :: [Attribute] -> Element base_ = with (ENode "base" [] [])
65
base_ = with (ENode "base" [] [])
33
false
true
0
8
11
41
19
22
null
null
osa1/Idris-dev
src/Idris/AbsSyntaxTree.hs
bsd-3-clause
eqOpts = []
11
eqOpts = []
11
eqOpts = []
11
false
false
1
6
2
12
4
8
null
null
quchen/prettyprinter
prettyprinter-compat-wl-pprint/src/Text/PrettyPrint/Leijen.hs
bsd-2-clause
langle = New.langle
19
langle = New.langle
19
langle = New.langle
19
false
false
1
6
2
12
4
8
null
null
olorin/amazonka
amazonka-ml/gen/Network/AWS/MachineLearning/Types/Product.hs
mpl-2.0
-- | DataRearrangement - A JSON string that represents the splitting -- requirement of a 'DataSource'. -- -- Sample - -- ' \"{\\\"splitting\\\":{\\\"percentBegin\\\":10,\\\"percentEnd\\\":60}}\"' rdsdsDataRearrangement :: Lens' RDSDataSpec (Maybe Text) rdsdsDataRearrangement = lens _rdsdsDataRearrangement (\ s a -> s{_rdsdsDataRearrangement = a})
348
rdsdsDataRearrangement :: Lens' RDSDataSpec (Maybe Text) rdsdsDataRearrangement = lens _rdsdsDataRearrangement (\ s a -> s{_rdsdsDataRearrangement = a})
152
rdsdsDataRearrangement = lens _rdsdsDataRearrangement (\ s a -> s{_rdsdsDataRearrangement = a})
95
true
true
0
9
39
50
29
21
null
null
juhp/leksah
src/IDE/LogRef.hs
gpl-2.0
symbol = P.symbol lexer
23
symbol = P.symbol lexer
23
symbol = P.symbol lexer
23
false
false
0
6
3
11
5
6
null
null
tylerjl/adventofcode
app/Main.hs
mit
run 2018 1 file = do contents <- readFile file case frequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i case twiceFrequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i
259
run 2018 1 file = do contents <- readFile file case frequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i case twiceFrequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i
259
run 2018 1 file = do contents <- readFile file case frequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i case twiceFrequency contents of Nothing -> putStrLn $ "Could not parse" ++ file Just i -> print i
259
false
false
1
12
67
98
42
56
null
null
UoYCS-plasma/LazySmallCheck2012
suite/performance/Benchmarks/Huffman.hs
bsd-3-clause
del x (y:ys) = if x == y then Just ys else case del x ys of Nothing -> Nothing Just zs -> Just (y:zs)
191
del x (y:ys) = if x == y then Just ys else case del x ys of Nothing -> Nothing Just zs -> Just (y:zs)
191
del x (y:ys) = if x == y then Just ys else case del x ys of Nothing -> Nothing Just zs -> Just (y:zs)
191
false
false
0
11
114
67
33
34
null
null
rahulmutt/ghcvm
compiler/Eta/SimplCore/FloatIn.hs
bsd-3-clause
fiExpr dflags to_drop lam@(_, AnnLam _ _) | okToFloatInside bndrs -- Float in -- NB: Must line up with noFloatIntoRhs (AnnLam...); see Trac #7088 = mkLams bndrs (fiExpr dflags to_drop body) | otherwise -- Dump it all here = wrapFloats to_drop (mkLams bndrs (fiExpr dflags [] body)) where (bndrs, body) = collectAnnBndrs lam {- We don't float lets inwards past an SCC. ToDo: keep info on current cc, and when passing one, if it is not the same, annotate all lets in binds with current cc, change current cc to the new one and float binds into expr. -}
612
fiExpr dflags to_drop lam@(_, AnnLam _ _) | okToFloatInside bndrs -- Float in -- NB: Must line up with noFloatIntoRhs (AnnLam...); see Trac #7088 = mkLams bndrs (fiExpr dflags to_drop body) | otherwise -- Dump it all here = wrapFloats to_drop (mkLams bndrs (fiExpr dflags [] body)) where (bndrs, body) = collectAnnBndrs lam {- We don't float lets inwards past an SCC. ToDo: keep info on current cc, and when passing one, if it is not the same, annotate all lets in binds with current cc, change current cc to the new one and float binds into expr. -}
612
fiExpr dflags to_drop lam@(_, AnnLam _ _) | okToFloatInside bndrs -- Float in -- NB: Must line up with noFloatIntoRhs (AnnLam...); see Trac #7088 = mkLams bndrs (fiExpr dflags to_drop body) | otherwise -- Dump it all here = wrapFloats to_drop (mkLams bndrs (fiExpr dflags [] body)) where (bndrs, body) = collectAnnBndrs lam {- We don't float lets inwards past an SCC. ToDo: keep info on current cc, and when passing one, if it is not the same, annotate all lets in binds with current cc, change current cc to the new one and float binds into expr. -}
612
false
false
0
10
160
114
54
60
null
null
tpltnt/Tidal
Sound/Tidal/Pattern.hs
gpl-3.0
-- Filter out events that have had their onsets cut off filterOnsets :: Pattern a -> Pattern a filterOnsets (Pattern f) = Pattern $ (filter (\e -> eventOnset e >= eventStart e)) . f
183
filterOnsets :: Pattern a -> Pattern a filterOnsets (Pattern f) = Pattern $ (filter (\e -> eventOnset e >= eventStart e)) . f
127
filterOnsets (Pattern f) = Pattern $ (filter (\e -> eventOnset e >= eventStart e)) . f
88
true
true
2
11
35
69
32
37
null
null
snoyberg/ghc
compiler/simplCore/CallArity.hs
bsd-3-clause
resDelList :: [Var] -> CallArityRes -> CallArityRes resDelList vs ae = foldr resDel ae vs
89
resDelList :: [Var] -> CallArityRes -> CallArityRes resDelList vs ae = foldr resDel ae vs
89
resDelList vs ae = foldr resDel ae vs
37
false
true
0
6
14
34
17
17
null
null
AlexanderPankiv/ghc
compiler/nativeGen/PPC/Ppr.hs
bsd-3-clause
pprInstr (FADD fmt reg1 reg2 reg3) = pprBinaryF (sLit "fadd") fmt reg1 reg2 reg3
80
pprInstr (FADD fmt reg1 reg2 reg3) = pprBinaryF (sLit "fadd") fmt reg1 reg2 reg3
80
pprInstr (FADD fmt reg1 reg2 reg3) = pprBinaryF (sLit "fadd") fmt reg1 reg2 reg3
80
false
false
0
7
13
39
18
21
null
null
jacekszymanski/wxHaskell
wxcore/src/haskell/Graphics/UI/WXCore/WxcDefs.hs
lgpl-2.1
wxSTC_LEX_ESCRIPT :: Int wxSTC_LEX_ESCRIPT = 41
47
wxSTC_LEX_ESCRIPT :: Int wxSTC_LEX_ESCRIPT = 41
47
wxSTC_LEX_ESCRIPT = 41
22
false
true
0
4
5
11
6
5
null
null
tinco/nanc
Nanc/IR/Expression/Helpers.hs
mit
isInteger (AST.ConstantOperand (C.Int _ _)) = True
50
isInteger (AST.ConstantOperand (C.Int _ _)) = True
50
isInteger (AST.ConstantOperand (C.Int _ _)) = True
50
false
false
0
9
6
28
13
15
null
null
jpbetz/protolang
haskell/Main.hs
apache-2.0
main :: IO () main = do args <- getArgs case args of [] -> readExecutePrintLoop [filename] -> compileFile filename
134
main :: IO () main = do args <- getArgs case args of [] -> readExecutePrintLoop [filename] -> compileFile filename
134
main = do args <- getArgs case args of [] -> readExecutePrintLoop [filename] -> compileFile filename
120
false
true
0
10
39
50
24
26
null
null
toonn/quintessence
src/Lexer.hs
bsd-2-clause
literal :: Parser Integer literal = integer
43
literal :: Parser Integer literal = integer
43
literal = integer
17
false
true
0
5
6
14
7
7
null
null
ghc-android/ghc
compiler/deSugar/Coverage.hs
bsd-3-clause
addTickMatchGroup :: Bool{-is lambda-} -> MatchGroup Id (LHsExpr Id) -> TM (MatchGroup Id (LHsExpr Id)) addTickMatchGroup is_lam mg@(MG { mg_alts = matches }) = do let isOneOfMany = matchesOneOfMany matches matches' <- mapM (liftL (addTickMatch isOneOfMany is_lam)) matches return $ mg { mg_alts = matches' }
314
addTickMatchGroup :: Bool{-is lambda-} -> MatchGroup Id (LHsExpr Id) -> TM (MatchGroup Id (LHsExpr Id)) addTickMatchGroup is_lam mg@(MG { mg_alts = matches }) = do let isOneOfMany = matchesOneOfMany matches matches' <- mapM (liftL (addTickMatch isOneOfMany is_lam)) matches return $ mg { mg_alts = matches' }
314
addTickMatchGroup is_lam mg@(MG { mg_alts = matches }) = do let isOneOfMany = matchesOneOfMany matches matches' <- mapM (liftL (addTickMatch isOneOfMany is_lam)) matches return $ mg { mg_alts = matches' }
210
false
true
0
12
51
121
60
61
null
null
kawamuray/ganeti
src/Ganeti/HTools/Loader.hs
gpl-2.0
-- | Given am indexed node list, and the name of the master, mark it as such. setMaster :: (Monad m) => NameAssoc -> Node.List -> String -> m Node.List setMaster node_names node_idx master = do kmaster <- maybe (fail $ "Master node " ++ master ++ " unknown") return $ M.lookup master node_names let mnode = Container.find kmaster node_idx return $ Container.add kmaster (Node.setMaster mnode True) node_idx -- | For each instance, add its index to its primary and secondary nodes.
501
setMaster :: (Monad m) => NameAssoc -> Node.List -> String -> m Node.List setMaster node_names node_idx master = do kmaster <- maybe (fail $ "Master node " ++ master ++ " unknown") return $ M.lookup master node_names let mnode = Container.find kmaster node_idx return $ Container.add kmaster (Node.setMaster mnode True) node_idx -- | For each instance, add its index to its primary and secondary nodes.
422
setMaster node_names node_idx master = do kmaster <- maybe (fail $ "Master node " ++ master ++ " unknown") return $ M.lookup master node_names let mnode = Container.find kmaster node_idx return $ Container.add kmaster (Node.setMaster mnode True) node_idx -- | For each instance, add its index to its primary and secondary nodes.
348
true
true
0
14
102
133
63
70
null
null
jacekszymanski/wxHaskell
wxcore/src/haskell/Graphics/UI/WXCore/WxcDefs.hs
lgpl-2.1
wxFILTER_ASCII :: Int wxFILTER_ASCII = 1
40
wxFILTER_ASCII :: Int wxFILTER_ASCII = 1
40
wxFILTER_ASCII = 1
18
false
true
0
4
5
11
6
5
null
null
benkio/VRP
src/Behaviour/NodeAndPathCalculator.hs
gpl-3.0
validator veicleCapacity nodes = (demandIsValid veicleCapacity (map snd nodes)) && not (duplicateCheck nodes) && head nodes == ((0,0),0)
136
validator veicleCapacity nodes = (demandIsValid veicleCapacity (map snd nodes)) && not (duplicateCheck nodes) && head nodes == ((0,0),0)
136
validator veicleCapacity nodes = (demandIsValid veicleCapacity (map snd nodes)) && not (duplicateCheck nodes) && head nodes == ((0,0),0)
136
false
false
0
11
17
63
32
31
null
null
text-utf8/text
tests/Tests/QuickCheckUtils.hs
bsd-2-clause
arbitraryPrecision :: Int -> Gen (Precision a) arbitraryPrecision maxDigits = Precision <$> do n <- choose (-1,maxDigits) return $ if n == -1 then Nothing else Just n
192
arbitraryPrecision :: Int -> Gen (Precision a) arbitraryPrecision maxDigits = Precision <$> do n <- choose (-1,maxDigits) return $ if n == -1 then Nothing else Just n
192
arbitraryPrecision maxDigits = Precision <$> do n <- choose (-1,maxDigits) return $ if n == -1 then Nothing else Just n
145
false
true
0
12
53
78
37
41
null
null
lancelet/approxier
src/lib/Raster.hs
apache-2.0
white = Color 1 1 1
19
white = Color 1 1 1
19
white = Color 1 1 1
19
false
false
0
5
5
13
6
7
null
null
23Skidoo/aeson
Data/Aeson/TH.hs
bsd-3-clause
(<^>) :: ExpQ -> ExpQ -> ExpQ (<^>) a b = infixApp a [|(<>)|] b
63
(<^>) :: ExpQ -> ExpQ -> ExpQ (<^>) a b = infixApp a [|(<>)|] b
63
(<^>) a b = infixApp a [|(<>)|] b
33
false
true
0
8
14
46
23
23
null
null
deckool/my-hs-github
Github/Repos.hs
bsd-3-clause
-- | The repos for an organization, by the organization name. -- | With authentication -- -- > organizationRepos (Just (GithubUser (user, password))) "thoughtbot" organizationRepos' :: Maybe GithubAuth -> String -> IO (Either Error [Repo]) organizationRepos' auth orgName = githubGet' auth ["orgs", orgName, "repos"]
316
organizationRepos' :: Maybe GithubAuth -> String -> IO (Either Error [Repo]) organizationRepos' auth orgName = githubGet' auth ["orgs", orgName, "repos"]
153
organizationRepos' auth orgName = githubGet' auth ["orgs", orgName, "repos"]
76
true
true
0
10
43
59
32
27
null
null
NCrashed/PowerCom
src/powercom/Channel/Options.hs
gpl-3.0
string2PortSpeed :: String -> CommSpeed string2PortSpeed str = case str of "110" -> CS110 "300" -> CS300 "600" -> CS600 "1200" -> CS1200 "2400" -> CS2400 "4800" -> CS4800 "9600" -> CS9600 "19200" -> CS19200 "38400" -> CS38400 "57600" -> CS57600 "115200" -> CS115200 _ -> CS2400
352
string2PortSpeed :: String -> CommSpeed string2PortSpeed str = case str of "110" -> CS110 "300" -> CS300 "600" -> CS600 "1200" -> CS1200 "2400" -> CS2400 "4800" -> CS4800 "9600" -> CS9600 "19200" -> CS19200 "38400" -> CS38400 "57600" -> CS57600 "115200" -> CS115200 _ -> CS2400
352
string2PortSpeed str = case str of "110" -> CS110 "300" -> CS300 "600" -> CS600 "1200" -> CS1200 "2400" -> CS2400 "4800" -> CS4800 "9600" -> CS9600 "19200" -> CS19200 "38400" -> CS38400 "57600" -> CS57600 "115200" -> CS115200 _ -> CS2400
312
false
true
0
8
121
100
48
52
null
null
brendanhay/gogol
gogol-run/gen/Network/Google/Run/Types/Product.hs
mpl-2.0
-- | Optional. One-word CamelCase reason for the condition\'s last -- transition. gcrvcReason :: Lens' GoogleCloudRunV1Condition (Maybe Text) gcrvcReason = lens _gcrvcReason (\ s a -> s{_gcrvcReason = a})
206
gcrvcReason :: Lens' GoogleCloudRunV1Condition (Maybe Text) gcrvcReason = lens _gcrvcReason (\ s a -> s{_gcrvcReason = a})
124
gcrvcReason = lens _gcrvcReason (\ s a -> s{_gcrvcReason = a})
64
true
true
0
9
30
49
26
23
null
null
joelburget/daily-typecheckers
src/Day5.hs
bsd-3-clause
hoistMaybe :: Monad m => String -> Maybe a -> EitherT String m a hoistMaybe msg = maybe (left msg) right
104
hoistMaybe :: Monad m => String -> Maybe a -> EitherT String m a hoistMaybe msg = maybe (left msg) right
104
hoistMaybe msg = maybe (left msg) right
39
false
true
0
8
20
50
23
27
null
null
AnttiLukats/orp
software/tools/tidl/src/Tidl/Generate/Java.hs
apache-2.0
generateFieldSerial' name (FInt IKUnsigned IS64) = text "TIDL.uint64_serialize(out," <+> text name <> text ");"
111
generateFieldSerial' name (FInt IKUnsigned IS64) = text "TIDL.uint64_serialize(out," <+> text name <> text ");"
111
generateFieldSerial' name (FInt IKUnsigned IS64) = text "TIDL.uint64_serialize(out," <+> text name <> text ");"
111
false
false
0
7
13
36
16
20
null
null
rvl/hsoz
src/Network/Iron.hs
bsd-3-clause
macPrefix, macFormatVersion :: ByteString macPrefix = "Fe26." <> macFormatVersion
81
macPrefix, macFormatVersion :: ByteString macPrefix = "Fe26." <> macFormatVersion
81
macPrefix = "Fe26." <> macFormatVersion
39
false
true
0
5
8
17
10
7
null
null
fmapfmapfmap/amazonka
amazonka-swf/gen/Network/AWS/SWF/RespondActivityTaskCanceled.hs
mpl-2.0
-- | The 'taskToken' of the ActivityTask. -- -- 'taskToken' is generated by the service and should be treated as an -- opaque value. If the task is passed to another process, its 'taskToken' -- must also be passed. This enables it to provide its progress and respond -- with results. rTaskToken :: Lens' RespondActivityTaskCanceled Text rTaskToken = lens _rTaskToken (\ s a -> s{_rTaskToken = a})
396
rTaskToken :: Lens' RespondActivityTaskCanceled Text rTaskToken = lens _rTaskToken (\ s a -> s{_rTaskToken = a})
112
rTaskToken = lens _rTaskToken (\ s a -> s{_rTaskToken = a})
59
true
true
1
9
66
50
27
23
null
null
michaelt/streaming-bytestring
Data/ByteString/Streaming/Char8.hs
bsd-3-clause
-- | /O(1)/ Unlike 'cons', 'cons\'' is -- strict in the ByteString that we are consing onto. More precisely, it forces -- the head and the first chunk. It does this because, for space efficiency, it -- may coalesce the new byte onto the first \'chunk\' rather than starting a -- new \'chunk\'. -- -- So that means you can't use a lazy recursive contruction like this: -- -- > let xs = cons\' c xs in xs -- -- You can however use 'cons', as well as 'repeat' and 'cycle', to build -- infinite lazy ByteStrings. -- cons' :: Char -> ByteString m r -> ByteString m r cons' c (Chunk bs bss) | B.length bs < 16 = Chunk (B.cons (c2w c) bs) bss
635
cons' :: Char -> ByteString m r -> ByteString m r cons' c (Chunk bs bss) | B.length bs < 16 = Chunk (B.cons (c2w c) bs) bss
123
cons' c (Chunk bs bss) | B.length bs < 16 = Chunk (B.cons (c2w c) bs) bss
73
true
true
0
10
125
91
49
42
null
null
supki/scrobblers
src/Control/Scrobbler/Algorithm.hs
bsd-2-clause
-- | Check if candidate is ready to be scrobbled with custom rules contestWith :: MonadIO m => Rules -> Scrobbler m (PlayerStateChange Track) (Scrobble (Stamped Track)) contestWith f = contestWith' f . (time' &&& id)
240
contestWith :: MonadIO m => Rules -> Scrobbler m (PlayerStateChange Track) (Scrobble (Stamped Track)) contestWith f = contestWith' f . (time' &&& id)
173
contestWith f = contestWith' f . (time' &&& id)
47
true
true
0
11
59
65
32
33
null
null
opensuse-haskell/configuration
src/cabal2obs/cabal2obs.hs
gpl-3.0
extractPackageSetIdAndBuildName :: MonadFail m => FilePath -> m (PackageSetId, BuildName) extractPackageSetIdAndBuildName p | [_,psid,bn,_] <- splitDirectories p = pure (PackageSetId psid, BuildName bn) | otherwise = fail ("path does not refer to built *.spec or *.changes file: " ++ show p)
321
extractPackageSetIdAndBuildName :: MonadFail m => FilePath -> m (PackageSetId, BuildName) extractPackageSetIdAndBuildName p | [_,psid,bn,_] <- splitDirectories p = pure (PackageSetId psid, BuildName bn) | otherwise = fail ("path does not refer to built *.spec or *.changes file: " ++ show p)
321
extractPackageSetIdAndBuildName p | [_,psid,bn,_] <- splitDirectories p = pure (PackageSetId psid, BuildName bn) | otherwise = fail ("path does not refer to built *.spec or *.changes file: " ++ show p)
231
false
true
1
9
70
94
47
47
null
null
mcmaniac/ghc
compiler/cmm/CmmType.hs
bsd-3-clause
widthFromBytes 10 = W80
23
widthFromBytes 10 = W80
23
widthFromBytes 10 = W80
23
false
false
1
5
3
13
4
9
null
null
AmpersandTarski/ampersand
src/Ampersand/Input/ADL1/Lexer.hs
gpl-3.0
isOperatorBegin :: Char -> Bool isOperatorBegin = locatein (map head operators)
80
isOperatorBegin :: Char -> Bool isOperatorBegin = locatein (map head operators)
80
isOperatorBegin = locatein (map head operators)
48
false
true
0
7
11
33
14
19
null
null
fmapfmapfmap/amazonka
amazonka-cloudhsm/test/Test/AWS/Gen/CloudHSM.hs
mpl-2.0
testDescribeHAPGResponse :: DescribeHAPGResponse -> TestTree testDescribeHAPGResponse = res "DescribeHAPGResponse" "fixture/DescribeHAPGResponse.proto" cloudHSM (Proxy :: Proxy DescribeHAPG)
206
testDescribeHAPGResponse :: DescribeHAPGResponse -> TestTree testDescribeHAPGResponse = res "DescribeHAPGResponse" "fixture/DescribeHAPGResponse.proto" cloudHSM (Proxy :: Proxy DescribeHAPG)
206
testDescribeHAPGResponse = res "DescribeHAPGResponse" "fixture/DescribeHAPGResponse.proto" cloudHSM (Proxy :: Proxy DescribeHAPG)
145
false
true
0
7
30
42
18
24
null
null
li-zhirui/EoplLangs
src/SimpleModule/TypeChecker.hs
bsd-3-clause
typeOfLetExpr :: [(String, Expression)] -> Expression -> TypeEnvironment -> TypeResult typeOfLetExpr binds body tenv = do typeBinds <- reverse <$> foldl func (return []) binds typeOf body (extendMany typeBinds tenv) where func acc (name, expr) = do typeBinds <- acc typ <- typeOf expr tenv return $ (name, typ) : typeBinds
364
typeOfLetExpr :: [(String, Expression)] -> Expression -> TypeEnvironment -> TypeResult typeOfLetExpr binds body tenv = do typeBinds <- reverse <$> foldl func (return []) binds typeOf body (extendMany typeBinds tenv) where func acc (name, expr) = do typeBinds <- acc typ <- typeOf expr tenv return $ (name, typ) : typeBinds
364
typeOfLetExpr binds body tenv = do typeBinds <- reverse <$> foldl func (return []) binds typeOf body (extendMany typeBinds tenv) where func acc (name, expr) = do typeBinds <- acc typ <- typeOf expr tenv return $ (name, typ) : typeBinds
263
false
true
0
12
92
135
67
68
null
null
deech/stack
src/Stack/Types/Config.hs
bsd-3-clause
packageCachesL :: HasConfig env => Lens' env (IORef (Maybe (Map PackageIdentifier (PackageIndex, PackageCache) ,HashMap GitSHA1 (PackageIndex, OffsetSize)))) packageCachesL = configL.lens configPackageCaches (\x y -> x { configPackageCaches = y })
269
packageCachesL :: HasConfig env => Lens' env (IORef (Maybe (Map PackageIdentifier (PackageIndex, PackageCache) ,HashMap GitSHA1 (PackageIndex, OffsetSize)))) packageCachesL = configL.lens configPackageCaches (\x y -> x { configPackageCaches = y })
269
packageCachesL = configL.lens configPackageCaches (\x y -> x { configPackageCaches = y })
89
false
true
0
11
51
89
47
42
null
null
f1u77y/xmonad-contrib
XMonad/Actions/Search.hs
bsd-3-clause
google = searchEngine "google" "http://www.google.com/search?num=100&q="
86
google = searchEngine "google" "http://www.google.com/search?num=100&q="
86
google = searchEngine "google" "http://www.google.com/search?num=100&q="
86
false
false
1
5
18
14
5
9
null
null
sinelaw/lamdu
Lamdu/Sugar/Convert/Expression.hs
gpl-3.0
mkGen :: Int -> Int -> Guid -> Random.StdGen mkGen select count = Random.mkStdGen . (+select) . (*count) . BinaryUtils.decodeS . Guid.bs
138
mkGen :: Int -> Int -> Guid -> Random.StdGen mkGen select count = Random.mkStdGen . (+select) . (*count) . BinaryUtils.decodeS . Guid.bs
138
mkGen select count = Random.mkStdGen . (+select) . (*count) . BinaryUtils.decodeS . Guid.bs
93
false
true
0
9
23
60
32
28
null
null
toonn/haskell-casestt
koopa.hs
bsd-2-clause
greenPathTwo :: Path Green (Pos (S(S(S(S(S(S(S Z))))))) (S(S(S(S(S(S Z)))))) Gas Low) (Pos (S(S(S(S(S Z))))) Z Gas Low) greenPathTwo = Pcons p76 Back $ Pcons p66 Back $ Pcons p56 Fall $ Pcons p55 Fall $ Pcons p54 Back $ Pcons p44 Back $ Pcons p34 Back $ Pcons p24 Fall $ Pcons p23 Fall $ Pcons p22 Fall $ Pcons p21 Back $ Pcons p11 Next $ Pcons p21 Next $ Pcons p31 Next $ Pcons p41 Next $ Pcons p51 Fall P0
661
greenPathTwo :: Path Green (Pos (S(S(S(S(S(S(S Z))))))) (S(S(S(S(S(S Z)))))) Gas Low) (Pos (S(S(S(S(S Z))))) Z Gas Low) greenPathTwo = Pcons p76 Back $ Pcons p66 Back $ Pcons p56 Fall $ Pcons p55 Fall $ Pcons p54 Back $ Pcons p44 Back $ Pcons p34 Back $ Pcons p24 Fall $ Pcons p23 Fall $ Pcons p22 Fall $ Pcons p21 Back $ Pcons p11 Next $ Pcons p21 Next $ Pcons p31 Next $ Pcons p41 Next $ Pcons p51 Fall P0
661
greenPathTwo = Pcons p76 Back $ Pcons p66 Back $ Pcons p56 Fall $ Pcons p55 Fall $ Pcons p54 Back $ Pcons p44 Back $ Pcons p34 Back $ Pcons p24 Fall $ Pcons p23 Fall $ Pcons p22 Fall $ Pcons p21 Back $ Pcons p11 Next $ Pcons p21 Next $ Pcons p31 Next $ Pcons p41 Next $ Pcons p51 Fall P0
482
false
true
0
21
336
292
138
154
null
null
robeverest/accelerate
Data/Array/Accelerate/Smart.hs
bsd-3-clause
mkMod :: (Elt t, IsIntegral t) => Exp t -> Exp t -> Exp t mkMod x y = Exp $ PrimMod integralType `PrimApp` tup2 (x, y)
118
mkMod :: (Elt t, IsIntegral t) => Exp t -> Exp t -> Exp t mkMod x y = Exp $ PrimMod integralType `PrimApp` tup2 (x, y)
118
mkMod x y = Exp $ PrimMod integralType `PrimApp` tup2 (x, y)
60
false
true
0
8
26
70
35
35
null
null
MasseR/xmonadcontrib
XMonad/Actions/CycleWS.hs
bsd-3-clause
-- | Move focused window to workspace on prev screen shiftPrevScreen :: X () shiftPrevScreen = shiftScreenBy (-1)
113
shiftPrevScreen :: X () shiftPrevScreen = shiftScreenBy (-1)
60
shiftPrevScreen = shiftScreenBy (-1)
36
true
true
0
7
17
25
13
12
null
null
AntonXue/SSTG
src/SSTG/Utils/Printing.hs
bsd-3-clause
pprConstraintStr :: Constraint -> String pprConstraintStr (Constraint acon svar locals hold) = injIntoList acc_strs where acon_str = pprAltConStr acon svar_str = pprVarStr svar locs_str = pprLocalsStr locals hold_str = if hold then "Positive" else "Negative" acc_strs = [acon_str, svar_str, locs_str, hold_str]
332
pprConstraintStr :: Constraint -> String pprConstraintStr (Constraint acon svar locals hold) = injIntoList acc_strs where acon_str = pprAltConStr acon svar_str = pprVarStr svar locs_str = pprLocalsStr locals hold_str = if hold then "Positive" else "Negative" acc_strs = [acon_str, svar_str, locs_str, hold_str]
332
pprConstraintStr (Constraint acon svar locals hold) = injIntoList acc_strs where acon_str = pprAltConStr acon svar_str = pprVarStr svar locs_str = pprLocalsStr locals hold_str = if hold then "Positive" else "Negative" acc_strs = [acon_str, svar_str, locs_str, hold_str]
291
false
true
0
7
62
90
48
42
null
null
mreider/kinda-might-work
src/DB.hs
mit
transaction :: (MonadIO io) => DB -> Transaction a -> io a transaction (DB pool) t = liftIO (runSqlPersistMPool t pool)
120
transaction :: (MonadIO io) => DB -> Transaction a -> io a transaction (DB pool) t = liftIO (runSqlPersistMPool t pool)
120
transaction (DB pool) t = liftIO (runSqlPersistMPool t pool)
61
false
true
0
8
21
56
27
29
null
null
silkapp/xmlhtml-xpath
src/Xml/XPath/Parser.hs
bsd-3-clause
abbreviatedRelativeLocationPath :: Parser [Step] abbreviatedRelativeLocationPath = (descendantOrSelf :) <$> (token "//" *> (pure <$> step))
139
abbreviatedRelativeLocationPath :: Parser [Step] abbreviatedRelativeLocationPath = (descendantOrSelf :) <$> (token "//" *> (pure <$> step))
139
abbreviatedRelativeLocationPath = (descendantOrSelf :) <$> (token "//" *> (pure <$> step))
90
false
true
0
9
14
42
23
19
null
null
nfjinjing/level5
src/MusicPad/Model/Verse.hs
bsd-3-clause
mod_verse_at :: Game State -> Int -> (Verse -> Verse) -> IO () mod_verse_at g i f = do with_state g - \_state -> do let verse_index = _state.song.current_verse_index current_verse = _state.song.verses.at verse_index new_verse = f current_verse g.state $~ set (__song > __verses) (_state.song.verses.replace_at verse_index new_verse)
363
mod_verse_at :: Game State -> Int -> (Verse -> Verse) -> IO () mod_verse_at g i f = do with_state g - \_state -> do let verse_index = _state.song.current_verse_index current_verse = _state.song.verses.at verse_index new_verse = f current_verse g.state $~ set (__song > __verses) (_state.song.verses.replace_at verse_index new_verse)
363
mod_verse_at g i f = do with_state g - \_state -> do let verse_index = _state.song.current_verse_index current_verse = _state.song.verses.at verse_index new_verse = f current_verse g.state $~ set (__song > __verses) (_state.song.verses.replace_at verse_index new_verse)
300
false
true
0
17
76
130
63
67
null
null
joeyadams/haskell-iocp
IOCP/PSQ.hs
bsd-3-clause
rsingleRight k1 p1 v1 (RLoser _ (E k2 p2 v2) t1 m1 t2) m2 t3 | p1 <= p2 = rloser k1 p1 v1 t1 m1 (lloser k2 p2 v2 t2 m2 t3) | otherwise = rloser k2 p2 v2 t1 m1 (rloser k1 p1 v1 t2 m2 t3)
194
rsingleRight k1 p1 v1 (RLoser _ (E k2 p2 v2) t1 m1 t2) m2 t3 | p1 <= p2 = rloser k1 p1 v1 t1 m1 (lloser k2 p2 v2 t2 m2 t3) | otherwise = rloser k2 p2 v2 t1 m1 (rloser k1 p1 v1 t2 m2 t3)
194
rsingleRight k1 p1 v1 (RLoser _ (E k2 p2 v2) t1 m1 t2) m2 t3 | p1 <= p2 = rloser k1 p1 v1 t1 m1 (lloser k2 p2 v2 t2 m2 t3) | otherwise = rloser k2 p2 v2 t1 m1 (rloser k1 p1 v1 t2 m2 t3)
194
false
false
1
9
57
118
57
61
null
null
naoto-ogawa/h-xproto-mysql
src/DataBase/MySQLX/ExprParser.hs
mit
atomDoubleAsterisk :: StateT ParserState Parser PDPI.DocumentPathItem atomDoubleAsterisk = atomDoubleAsterisk_ >> return mkDoubleAsterisk
138
atomDoubleAsterisk :: StateT ParserState Parser PDPI.DocumentPathItem atomDoubleAsterisk = atomDoubleAsterisk_ >> return mkDoubleAsterisk
137
atomDoubleAsterisk = atomDoubleAsterisk_ >> return mkDoubleAsterisk
67
false
true
0
6
12
27
13
14
null
null
JoshuaGross/haskell-learning-log
Code/Haskellbook/Record.hs
mit
allProgrammers :: [Programmer] allProgrammers = nub $ foldr (\(a,b) c -> Programmer a b : c) [] (comboOfN allOperatingSystems allProgrammingLanguages)
150
allProgrammers :: [Programmer] allProgrammers = nub $ foldr (\(a,b) c -> Programmer a b : c) [] (comboOfN allOperatingSystems allProgrammingLanguages)
150
allProgrammers = nub $ foldr (\(a,b) c -> Programmer a b : c) [] (comboOfN allOperatingSystems allProgrammingLanguages)
119
false
true
0
10
19
60
32
28
null
null
snoyberg/photosorter
Import.hs
bsd-2-clause
toFilePath' :: FilePath -> FilePath' toFilePath' = FilePath' . either id id . toText
84
toFilePath' :: FilePath -> FilePath' toFilePath' = FilePath' . either id id . toText
84
toFilePath' = FilePath' . either id id . toText
47
false
true
0
7
13
28
14
14
null
null
sonyandy/unvar
src/UnVar.hs
bsd-3-clause
newMutVarOccName :: Stable OccName newMutVarOccName = Stable $ mkVarOcc "newMutVar#"
84
newMutVarOccName :: Stable OccName newMutVarOccName = Stable $ mkVarOcc "newMutVar#"
84
newMutVarOccName = Stable $ mkVarOcc "newMutVar#"
49
false
true
0
6
9
21
10
11
null
null
dragosboca/xmobar
src/Plugins/Monitors/Batt.hs
bsd-3-clause
sysDir :: FilePath sysDir = "/sys/class/power_supply"
53
sysDir :: FilePath sysDir = "/sys/class/power_supply"
53
sysDir = "/sys/class/power_supply"
34
false
true
0
6
5
18
7
11
null
null
tolysz/prepare-ghcjs
spec-lts8/cabal/Cabal/Distribution/Simple/GHC/IPIConvert.hs
bsd-3-clause
convertLicense OtherLicense = Current.OtherLicense
50
convertLicense OtherLicense = Current.OtherLicense
50
convertLicense OtherLicense = Current.OtherLicense
50
false
false
0
5
3
11
5
6
null
null
badp/ganeti
src/Ganeti/Constants.hs
gpl-2.0
ssReleaseVersion :: String ssReleaseVersion = "release_version"
63
ssReleaseVersion :: String ssReleaseVersion = "release_version"
63
ssReleaseVersion = "release_version"
36
false
true
0
4
5
11
6
5
null
null
jstolarek/lattice-structure-hs
bench/Signal/Wavelet/Repa1Bench.hs
bsd-3-clause
benchCsrS :: Array U DIM1 Double -> Array U DIM1 Double benchCsrS = forceS . csr
90
benchCsrS :: Array U DIM1 Double -> Array U DIM1 Double benchCsrS = forceS . csr
90
benchCsrS = forceS . csr
24
false
true
1
7
25
40
17
23
null
null
halogenandtoast/all_the_sokobans
haskell/src/Main.hs
mit
isCrate :: Level -> Coord -> Bool isCrate = flip elem . crates
62
isCrate :: Level -> Coord -> Bool isCrate = flip elem . crates
62
isCrate = flip elem . crates
28
false
true
1
8
12
34
14
20
null
null
pparkkin/eta
compiler/ETA/Prelude/PrelNames.hs
bsd-3-clause
inlineIdKey :: Unique inlineIdKey = mkPreludeMiscIdUnique 120
79
inlineIdKey :: Unique inlineIdKey = mkPreludeMiscIdUnique 120
79
inlineIdKey = mkPreludeMiscIdUnique 120
57
false
true
0
5
24
14
7
7
null
null
google/hs-dependent-literals
dependent-literals-plugin/tests/PolyLiterals.hs
apache-2.0
x6 :: (3 < n) => Fin n x6 = x where x = 3
44
x6 :: (3 < n) => Fin n x6 = x where x = 3
44
x6 = x where x = 3
21
false
true
1
8
17
42
18
24
null
null
SKA-ScienceDataProcessor/RC
MS2/Setup.hs
apache-2.0
nvccProgram :: Program nvccProgram = (simpleProgram "nvcc") { programFindVersion = findProgramVersion "--version" verSel } where verSel "" = "" verSel output = tail $ last $ words $ last $ lines output -- |Check for Halide and update configuration for building C++ files.
299
nvccProgram :: Program nvccProgram = (simpleProgram "nvcc") { programFindVersion = findProgramVersion "--version" verSel } where verSel "" = "" verSel output = tail $ last $ words $ last $ lines output -- |Check for Halide and update configuration for building C++ files.
299
nvccProgram = (simpleProgram "nvcc") { programFindVersion = findProgramVersion "--version" verSel } where verSel "" = "" verSel output = tail $ last $ words $ last $ lines output -- |Check for Halide and update configuration for building C++ files.
276
false
true
1
9
70
69
35
34
null
null
graninas/Andromeda
src/Andromeda/Assets/SpaceshipSample.hs
bsd-3-clause
guid1 = "3539390d-f189-4434-bd9e-d39e494a869a"
46
guid1 = "3539390d-f189-4434-bd9e-d39e494a869a"
46
guid1 = "3539390d-f189-4434-bd9e-d39e494a869a"
46
false
false
0
4
2
6
3
3
null
null
dimidd/senths
src/NBTrain.hs
gpl-3.0
trainFile :: NBModel -> FilePath -> IO NBModel trainFile m f = do tsvLines <- readLines f return $ foldr trainLine m tsvLines
133
trainFile :: NBModel -> FilePath -> IO NBModel trainFile m f = do tsvLines <- readLines f return $ foldr trainLine m tsvLines
133
trainFile m f = do tsvLines <- readLines f return $ foldr trainLine m tsvLines
86
false
true
0
8
30
51
23
28
null
null
perryleo/sicp
ch1/sicpc1e46.hs
mit
-- The new `sqrt` procedure newSqrt :: (Fractional a, Ord a) => a -> a newSqrt x = let closeEnough newGuess oldGuess = abs (newGuess - oldGuess) / oldGuess < 0.0001 improve guess = (guess + x / guess) / 2 in iterImprove closeEnough improve 1.0
261
newSqrt :: (Fractional a, Ord a) => a -> a newSqrt x = let closeEnough newGuess oldGuess = abs (newGuess - oldGuess) / oldGuess < 0.0001 improve guess = (guess + x / guess) / 2 in iterImprove closeEnough improve 1.0
233
newSqrt x = let closeEnough newGuess oldGuess = abs (newGuess - oldGuess) / oldGuess < 0.0001 improve guess = (guess + x / guess) / 2 in iterImprove closeEnough improve 1.0
190
true
true
0
13
63
98
49
49
null
null
ghc-android/ghc
compiler/typecheck/TcType.hs
bsd-3-clause
pprTcTyVarDetails (FlatSkol {}) = ptext (sLit "fsk")
55
pprTcTyVarDetails (FlatSkol {}) = ptext (sLit "fsk")
55
pprTcTyVarDetails (FlatSkol {}) = ptext (sLit "fsk")
55
false
false
0
7
9
25
12
13
null
null
chanind/haskell-99-problems
Problem10.hs
mit
lengthEncode :: (Eq a) => [a] -> [(Int, a)] lengthEncode list = [(length x, head x) | x <- group list]
102
lengthEncode :: (Eq a) => [a] -> [(Int, a)] lengthEncode list = [(length x, head x) | x <- group list]
102
lengthEncode list = [(length x, head x) | x <- group list]
58
false
true
0
8
20
65
35
30
null
null
tom-lpsd/tokyocabinet-haskell
Database/TokyoCabinet/FDB.hs
bsd-3-clause
tune :: FDB -- ^ FDB object. -> Int32 -- ^ the width of the value of each record. -> Int64 -- ^ the limit size of the database file. -> IO Bool -- ^ if successful, the return value is True. tune fdb width limsiz = withForeignPtr (unTCFDB fdb) $ \fdb' -> c_tcfdbtune fdb' width limsiz
310
tune :: FDB -- ^ FDB object. -> Int32 -- ^ the width of the value of each record. -> Int64 -- ^ the limit size of the database file. -> IO Bool tune fdb width limsiz = withForeignPtr (unTCFDB fdb) $ \fdb' -> c_tcfdbtune fdb' width limsiz
264
tune fdb width limsiz = withForeignPtr (unTCFDB fdb) $ \fdb' -> c_tcfdbtune fdb' width limsiz
97
true
true
0
9
83
66
33
33
null
null
kmyk/proof-haskell
Data/Lambda/UnTyped.hs
mit
-- | y f -> f (y f) yCombinator :: Lambda yCombinator = read "\\ f . (\\ x . f (x x)) (\\ x . f (x x))"
103
yCombinator :: Lambda yCombinator = read "\\ f . (\\ x . f (x x)) (\\ x . f (x x))"
83
yCombinator = read "\\ f . (\\ x . f (x x)) (\\ x . f (x x))"
61
true
true
0
6
28
22
9
13
null
null
rfranek/duckling
tests/Duckling/Numeral/KO/Tests.hs
bsd-3-clause
tests :: TestTree tests = testGroup "KO Tests" [ makeCorpusTest [This Numeral] corpus ]
91
tests :: TestTree tests = testGroup "KO Tests" [ makeCorpusTest [This Numeral] corpus ]
91
tests = testGroup "KO Tests" [ makeCorpusTest [This Numeral] corpus ]
73
false
true
0
9
17
38
16
22
null
null
mrak/coreutils.hs
src/head/Args.hs
mit
fromBytes :: Int -> Operation fromBytes b | b < 0 = LastBytes (abs b) | otherwise = Bytes b
103
fromBytes :: Int -> Operation fromBytes b | b < 0 = LastBytes (abs b) | otherwise = Bytes b
103
fromBytes b | b < 0 = LastBytes (abs b) | otherwise = Bytes b
73
false
true
0
8
31
49
22
27
null
null
ben-schulz/Idris-dev
src/Idris/Reflection.hs
bsd-3-clause
-- | Reify tactics from their reflected representation reify :: IState -> Term -> ElabD PTactic reify _ (P _ n _) | n == reflm "Intros" = return Intros
151
reify :: IState -> Term -> ElabD PTactic reify _ (P _ n _) | n == reflm "Intros" = return Intros
96
reify _ (P _ n _) | n == reflm "Intros" = return Intros
55
true
true
0
9
29
54
25
29
null
null
chaosim/peasy
coffee/samples/latex.hs
mit
circ 'U' = "Û"
14
circ 'U' = "Û"
14
circ 'U' = "Û"
14
false
false
1
5
3
13
4
9
null
null
TueHaulund/ROOPLC
src/CodeGenerator.hs
mit
getMethodName :: SIdentifier -> CodeGenerator MethodName getMethodName i = gets (symbolTable . saState) >>= \st -> case lookup i st of (Just (Method _ n)) -> return n _ -> throwError $ "ICE: Invalid method index " ++ show i
243
getMethodName :: SIdentifier -> CodeGenerator MethodName getMethodName i = gets (symbolTable . saState) >>= \st -> case lookup i st of (Just (Method _ n)) -> return n _ -> throwError $ "ICE: Invalid method index " ++ show i
243
getMethodName i = gets (symbolTable . saState) >>= \st -> case lookup i st of (Just (Method _ n)) -> return n _ -> throwError $ "ICE: Invalid method index " ++ show i
186
false
true
0
13
59
89
43
46
null
null
kim/amazonka
amazonka-lambda/gen/Network/AWS/Lambda/AddEventSource.hs
mpl-2.0
-- | A map (key-value pairs) defining the configuration for AWS Lambda to use when -- reading the event source. Currently, AWS Lambda supports only the 'InitialPositionInStream' key. The valid values are: "TRIM_HORIZON" and "LATEST". The default value is -- "TRIM_HORIZON". For more information, go to <http://docs.aws.amazon.com/kinesis/latest/APIReference/API_GetShardIterator.html#Kinesis-GetShardIterator-request-ShardIteratorType ShardIteratorType> in the Amazon -- Kinesis Service API Reference. aesParameters :: Lens' AddEventSource (HashMap Text Text) aesParameters = lens _aesParameters (\s a -> s { _aesParameters = a }) . _Map
637
aesParameters :: Lens' AddEventSource (HashMap Text Text) aesParameters = lens _aesParameters (\s a -> s { _aesParameters = a }) . _Map
135
aesParameters = lens _aesParameters (\s a -> s { _aesParameters = a }) . _Map
77
true
true
2
9
77
64
31
33
null
null
ekmett/ghc
compiler/cmm/CmmBuildInfoTables.hs
bsd-3-clause
addCAF :: CLabel -> TopSRT -> TopSRT addCAF caf srt = srt { next_elt = last + 1 , rev_elts = caf : rev_elts srt , elt_map = Map.insert caf last (elt_map srt) } where last = next_elt srt
205
addCAF :: CLabel -> TopSRT -> TopSRT addCAF caf srt = srt { next_elt = last + 1 , rev_elts = caf : rev_elts srt , elt_map = Map.insert caf last (elt_map srt) } where last = next_elt srt
205
addCAF caf srt = srt { next_elt = last + 1 , rev_elts = caf : rev_elts srt , elt_map = Map.insert caf last (elt_map srt) } where last = next_elt srt
168
false
true
0
9
58
80
42
38
null
null
tavisrudd/ghcjs-base
JavaScript/TypedArray/DataView.hs
mit
unsafeWriteInt32LE idx x dv = IO (I.js_unsafeSetInt32LE idx x dv)
65
unsafeWriteInt32LE idx x dv = IO (I.js_unsafeSetInt32LE idx x dv)
65
unsafeWriteInt32LE idx x dv = IO (I.js_unsafeSetInt32LE idx x dv)
65
false
false
0
8
9
28
13
15
null
null
Cahu/krpc-hs
src/KRPCHS/SpaceCenter.hs
gpl-3.0
getPartLegStream :: KRPCHS.SpaceCenter.Part -> RPCContext (KRPCStream (KRPCHS.SpaceCenter.Leg)) getPartLegStream thisArg = requestStream $ getPartLegStreamReq thisArg
166
getPartLegStream :: KRPCHS.SpaceCenter.Part -> RPCContext (KRPCStream (KRPCHS.SpaceCenter.Leg)) getPartLegStream thisArg = requestStream $ getPartLegStreamReq thisArg
166
getPartLegStream thisArg = requestStream $ getPartLegStreamReq thisArg
70
false
true
0
11
13
47
23
24
null
null
nevrenato/HetsAlloy
Comorphisms/CSMOF2CASL.hs
gpl-2.0
getSortGen :: Rel.Rel TypeClass -> Set.Set TypeClass -> Set.Set TypeClass -> Map.Map String TypeClass -> [Named CASLFORMULA] getSortGen typpR absCl typCl inst = disjointEmbedding absCl typpR ++ sortGeneration inst ++ sortGenerationNonAbstractSuperClasses typpR typCl absCl inst
293
getSortGen :: Rel.Rel TypeClass -> Set.Set TypeClass -> Set.Set TypeClass -> Map.Map String TypeClass -> [Named CASLFORMULA] getSortGen typpR absCl typCl inst = disjointEmbedding absCl typpR ++ sortGeneration inst ++ sortGenerationNonAbstractSuperClasses typpR typCl absCl inst
293
getSortGen typpR absCl typCl inst = disjointEmbedding absCl typpR ++ sortGeneration inst ++ sortGenerationNonAbstractSuperClasses typpR typCl absCl inst
154
false
true
0
10
50
89
41
48
null
null
haroldcarr/learn-haskell-coq-ml-etc
haskell/book/2007-Programming_in_Haskell-1st_Edition-Graham_Hutton/ch_08_10.hs
unlicense
char :: Char -> Parser Char char x = sat (== x)
49
char :: Char -> Parser Char char x = sat (== x)
49
char x = sat (== x)
21
false
true
0
6
13
31
15
16
null
null
juhp/stack
src/Data/Attoparsec/Interpreter.hs
bsd-3-clause
-- | Parser to extract the stack command line embedded inside a comment -- after validating the placement and formatting rules for a valid -- interpreter specification. interpreterArgsParser :: Bool -> String -> P.Parser String interpreterArgsParser isLiterate progName = P.option "" sheBangLine *> interpreterComment where sheBangLine = P.string "#!" *> P.manyTill P.anyChar P.endOfLine commentStart psr = (psr <?> (progName ++ " options comment")) *> P.skipSpace *> (P.string (pack progName) <?> show progName) -- Treat newlines as spaces inside the block comment anyCharNormalizeSpace = let normalizeSpace c = if isSpace c then ' ' else c in P.satisfyWith normalizeSpace $ const True comment start end = commentStart start *> ((end >> return "") <|> (P.space *> (P.manyTill anyCharNormalizeSpace end <?> "-}"))) horizontalSpace = P.satisfy P.isHorizontalSpace lineComment = comment "--" (P.endOfLine <|> P.endOfInput) literateLineComment = comment (">" *> horizontalSpace *> "--") (P.endOfLine <|> P.endOfInput) blockComment = comment "{-" (P.string "-}") literateBlockComment = (">" *> horizontalSpace *> "{-") *> P.skipMany (("" <$ horizontalSpace) <|> (P.endOfLine *> ">")) *> (P.string (pack progName) <?> progName) *> P.manyTill' (P.satisfy (not . P.isEndOfLine) <|> (' ' <$ (P.endOfLine *> ">" <?> ">"))) "-}" interpreterComment = if isLiterate then literateLineComment <|> literateBlockComment else lineComment <|> blockComment -- | Extract stack arguments from a correctly placed and correctly formatted -- comment when it is being used as an interpreter
1,844
interpreterArgsParser :: Bool -> String -> P.Parser String interpreterArgsParser isLiterate progName = P.option "" sheBangLine *> interpreterComment where sheBangLine = P.string "#!" *> P.manyTill P.anyChar P.endOfLine commentStart psr = (psr <?> (progName ++ " options comment")) *> P.skipSpace *> (P.string (pack progName) <?> show progName) -- Treat newlines as spaces inside the block comment anyCharNormalizeSpace = let normalizeSpace c = if isSpace c then ' ' else c in P.satisfyWith normalizeSpace $ const True comment start end = commentStart start *> ((end >> return "") <|> (P.space *> (P.manyTill anyCharNormalizeSpace end <?> "-}"))) horizontalSpace = P.satisfy P.isHorizontalSpace lineComment = comment "--" (P.endOfLine <|> P.endOfInput) literateLineComment = comment (">" *> horizontalSpace *> "--") (P.endOfLine <|> P.endOfInput) blockComment = comment "{-" (P.string "-}") literateBlockComment = (">" *> horizontalSpace *> "{-") *> P.skipMany (("" <$ horizontalSpace) <|> (P.endOfLine *> ">")) *> (P.string (pack progName) <?> progName) *> P.manyTill' (P.satisfy (not . P.isEndOfLine) <|> (' ' <$ (P.endOfLine *> ">" <?> ">"))) "-}" interpreterComment = if isLiterate then literateLineComment <|> literateBlockComment else lineComment <|> blockComment -- | Extract stack arguments from a correctly placed and correctly formatted -- comment when it is being used as an interpreter
1,675
interpreterArgsParser isLiterate progName = P.option "" sheBangLine *> interpreterComment where sheBangLine = P.string "#!" *> P.manyTill P.anyChar P.endOfLine commentStart psr = (psr <?> (progName ++ " options comment")) *> P.skipSpace *> (P.string (pack progName) <?> show progName) -- Treat newlines as spaces inside the block comment anyCharNormalizeSpace = let normalizeSpace c = if isSpace c then ' ' else c in P.satisfyWith normalizeSpace $ const True comment start end = commentStart start *> ((end >> return "") <|> (P.space *> (P.manyTill anyCharNormalizeSpace end <?> "-}"))) horizontalSpace = P.satisfy P.isHorizontalSpace lineComment = comment "--" (P.endOfLine <|> P.endOfInput) literateLineComment = comment (">" *> horizontalSpace *> "--") (P.endOfLine <|> P.endOfInput) blockComment = comment "{-" (P.string "-}") literateBlockComment = (">" *> horizontalSpace *> "{-") *> P.skipMany (("" <$ horizontalSpace) <|> (P.endOfLine *> ">")) *> (P.string (pack progName) <?> progName) *> P.manyTill' (P.satisfy (not . P.isEndOfLine) <|> (' ' <$ (P.endOfLine *> ">" <?> ">"))) "-}" interpreterComment = if isLiterate then literateLineComment <|> literateBlockComment else lineComment <|> blockComment -- | Extract stack arguments from a correctly placed and correctly formatted -- comment when it is being used as an interpreter
1,616
true
true
9
21
498
456
233
223
null
null
sdiehl/ghc
compiler/basicTypes/SrcLoc.hs
bsd-3-clause
-- | Combines two 'SrcSpan' into one that spans at least all the characters -- within both spans. Assumes the "file" part is the same in both inputs combineRealSrcSpans :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan combineRealSrcSpans span1 span2 = RealSrcSpan' file line_start col_start line_end col_end where (line_start, col_start) = min (srcSpanStartLine span1, srcSpanStartCol span1) (srcSpanStartLine span2, srcSpanStartCol span2) (line_end, col_end) = max (srcSpanEndLine span1, srcSpanEndCol span1) (srcSpanEndLine span2, srcSpanEndCol span2) file = srcSpanFile span1 -- | Convert a SrcSpan into one that represents only its first character
736
combineRealSrcSpans :: RealSrcSpan -> RealSrcSpan -> RealSrcSpan combineRealSrcSpans span1 span2 = RealSrcSpan' file line_start col_start line_end col_end where (line_start, col_start) = min (srcSpanStartLine span1, srcSpanStartCol span1) (srcSpanStartLine span2, srcSpanStartCol span2) (line_end, col_end) = max (srcSpanEndLine span1, srcSpanEndCol span1) (srcSpanEndLine span2, srcSpanEndCol span2) file = srcSpanFile span1 -- | Convert a SrcSpan into one that represents only its first character
587
combineRealSrcSpans span1 span2 = RealSrcSpan' file line_start col_start line_end col_end where (line_start, col_start) = min (srcSpanStartLine span1, srcSpanStartCol span1) (srcSpanStartLine span2, srcSpanStartCol span2) (line_end, col_end) = max (srcSpanEndLine span1, srcSpanEndCol span1) (srcSpanEndLine span2, srcSpanEndCol span2) file = srcSpanFile span1 -- | Convert a SrcSpan into one that represents only its first character
522
true
true
1
7
175
134
67
67
null
null
dkensinger/haskell
haskell-primes/NaiveSieveLimit.hs
gpl-3.0
-- Here we use a wheel to generate all the number that are not multiples -- of 2, 3, 5, and 7. We use some hard-coded data for that. wheel = 2:4:2:4:6:2:6:4:2:4:6:6:2:6:4:2:6:4:6:8:4:2:4:2:4:8:6:4:6:2:4:6 :2:6:6:4:2:4:6:2:6:4:2:4:2:10:2:10:wheel
248
wheel = 2:4:2:4:6:2:6:4:2:4:6:6:2:6:4:2:6:4:6:8:4:2:4:2:4:8:6:4:6:2:4:6 :2:6:6:4:2:4:6:2:6:4:2:4:2:10:2:10:wheel
113
wheel = 2:4:2:4:6:2:6:4:2:4:6:6:2:6:4:2:6:4:6:8:4:2:4:2:4:8:6:4:6:2:4:6 :2:6:6:4:2:4:6:2:6:4:2:4:2:10:2:10:wheel
113
true
false
4
35
35
203
101
102
null
null
alexander-b/thug-beginners
lessonB/B4FoldTraverse.hs
gpl-3.0
sumFold :: Foldable f => f Int -> Int sumFold = undefined
57
sumFold :: Foldable f => f Int -> Int sumFold = undefined
57
sumFold = undefined
19
false
true
0
8
11
32
13
19
null
null
YoEight/eventstore
Database/EventStore/Internal/Operation/Read/Common.hs
bsd-3-clause
sliceEOS (Slice _ next) = isNothing next
42
sliceEOS (Slice _ next) = isNothing next
42
sliceEOS (Slice _ next) = isNothing next
42
false
false
0
7
8
20
9
11
null
null
umairsd/course-haskell-cis194
hw07/JoinList.hs
mit
jlToList (Append _ l1 l2) = jlToList l1 ++ jlToList l2
54
jlToList (Append _ l1 l2) = jlToList l1 ++ jlToList l2
54
jlToList (Append _ l1 l2) = jlToList l1 ++ jlToList l2
54
false
false
0
7
10
29
13
16
null
null
hdbc/hdbc-odbc
testsrc/TestSbasics.hs
bsd-3-clause
testWithTransaction = dbTestCase (\dbh -> do assertBool "Connected database does not support transactions; skipping transaction test" (dbTransactionSupport dbh) sth <- prepare dbh "INSERT INTO hdbctest1 VALUES ('withTransaction', ?, NULL, NULL)" sExecute sth [Just "0"] commit dbh qrysth <- prepare dbh "SELECT testid FROM hdbctest1 WHERE testname = 'withTransaction' ORDER BY testid" sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "initial commit" [[Just "0"]]) -- Let's try a rollback. catch (withTransaction dbh (\_ -> do sExecuteMany sth rows fail "Foo")) (\(_ :: SomeException) -> return ()) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "rollback" [[Just "0"]]) -- And now a commit. withTransaction dbh (\_ -> sExecuteMany sth rows) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "final commit" ([Just "0"]:rows)) ) where rows = map (\x -> [Just . show $ x]) [1..9]
1,098
testWithTransaction = dbTestCase (\dbh -> do assertBool "Connected database does not support transactions; skipping transaction test" (dbTransactionSupport dbh) sth <- prepare dbh "INSERT INTO hdbctest1 VALUES ('withTransaction', ?, NULL, NULL)" sExecute sth [Just "0"] commit dbh qrysth <- prepare dbh "SELECT testid FROM hdbctest1 WHERE testname = 'withTransaction' ORDER BY testid" sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "initial commit" [[Just "0"]]) -- Let's try a rollback. catch (withTransaction dbh (\_ -> do sExecuteMany sth rows fail "Foo")) (\(_ :: SomeException) -> return ()) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "rollback" [[Just "0"]]) -- And now a commit. withTransaction dbh (\_ -> sExecuteMany sth rows) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "final commit" ([Just "0"]:rows)) ) where rows = map (\x -> [Just . show $ x]) [1..9]
1,098
testWithTransaction = dbTestCase (\dbh -> do assertBool "Connected database does not support transactions; skipping transaction test" (dbTransactionSupport dbh) sth <- prepare dbh "INSERT INTO hdbctest1 VALUES ('withTransaction', ?, NULL, NULL)" sExecute sth [Just "0"] commit dbh qrysth <- prepare dbh "SELECT testid FROM hdbctest1 WHERE testname = 'withTransaction' ORDER BY testid" sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "initial commit" [[Just "0"]]) -- Let's try a rollback. catch (withTransaction dbh (\_ -> do sExecuteMany sth rows fail "Foo")) (\(_ :: SomeException) -> return ()) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "rollback" [[Just "0"]]) -- And now a commit. withTransaction dbh (\_ -> sExecuteMany sth rows) sExecute qrysth [] sFetchAllRows qrysth >>= (assertEqual "final commit" ([Just "0"]:rows)) ) where rows = map (\x -> [Just . show $ x]) [1..9]
1,098
false
false
1
17
325
311
146
165
null
null
jtojnar/haste-compiler
libraries/ghc-7.10/ghc-prim/GHC/PrimopWrappers.hs
bsd-3-clause
makeStableName# :: a -> State# (RealWorld) -> (# State# (RealWorld),StableName# a #) makeStableName# a1 a2 = (GHC.Prim.makeStableName#) a1 a2
141
makeStableName# :: a -> State# (RealWorld) -> (# State# (RealWorld),StableName# a #) makeStableName# a1 a2 = (GHC.Prim.makeStableName#) a1 a2
141
makeStableName# a1 a2 = (GHC.Prim.makeStableName#) a1 a2
56
false
true
0
9
18
59
29
30
null
null
bgamari/text
tests/Tests/Properties.hs
bsd-2-clause
tl_Show = show `eq` (show . TL.pack)
50
tl_Show = show `eq` (show . TL.pack)
50
tl_Show = show `eq` (show . TL.pack)
50
false
false
0
8
20
21
12
9
null
null
qpliu/esolang
shiftprime/hs/repl.hs
gpl-3.0
hasDot :: [Token] -> Bool hasDot [] = False
43
hasDot :: [Token] -> Bool hasDot [] = False
43
hasDot [] = False
17
false
true
0
6
8
23
12
11
null
null
siddhanathan/yi
yi-core/src/Yi/Buffer/Adjusted.hs
gpl-2.0
deleteRegionB :: Region -> BufferM () deleteRegionB r = deleteNAt (regionDirection r) (fromIntegral (regionEnd r ~- regionStart r)) (regionStart r)
179
deleteRegionB :: Region -> BufferM () deleteRegionB r = deleteNAt (regionDirection r) (fromIntegral (regionEnd r ~- regionStart r)) (regionStart r)
179
deleteRegionB r = deleteNAt (regionDirection r) (fromIntegral (regionEnd r ~- regionStart r)) (regionStart r)
141
false
true
0
10
51
61
29
32
null
null
bickfordb/haskell-taglib
example.hs
lgpl-3.0
main = do args <- getArgs mapM showFile args
53
main = do args <- getArgs mapM showFile args
53
main = do args <- getArgs mapM showFile args
53
false
false
1
8
17
25
9
16
null
null
siddhanathan/ghc
compiler/hsSyn/HsExpr.hs
bsd-3-clause
ppr_cmd (HsCmdCast co cmd) = sep [ ppr_cmd cmd , ptext (sLit "|>") <+> ppr co ]
112
ppr_cmd (HsCmdCast co cmd) = sep [ ppr_cmd cmd , ptext (sLit "|>") <+> ppr co ]
112
ppr_cmd (HsCmdCast co cmd) = sep [ ppr_cmd cmd , ptext (sLit "|>") <+> ppr co ]
112
false
false
0
10
49
45
21
24
null
null
JustinUnger/haskell-book
ch11/ch11-ex.hs
mit
isSubsequenceOf :: (Eq a) => [a] -> [a] -> Bool isSubsequenceOf _ [] = False
76
isSubsequenceOf :: (Eq a) => [a] -> [a] -> Bool isSubsequenceOf _ [] = False
76
isSubsequenceOf _ [] = False
28
false
true
0
8
14
41
22
19
null
null
mvr/cf
src/Math/ContinuedFraction/Simple.hs
mit
hom (n0, _, d0, _) (CF []) = fromRational (n0 % d0)
56
hom (n0, _, d0, _) (CF []) = fromRational (n0 % d0)
56
hom (n0, _, d0, _) (CF []) = fromRational (n0 % d0)
56
false
false
0
7
16
43
22
21
null
null
osa1/Idris-dev
src/Idris/Error.hs
bsd-3-clause
tclift (Error err) = throwError err
35
tclift (Error err) = throwError err
35
tclift (Error err) = throwError err
35
false
false
0
6
5
19
8
11
null
null
elitak/frag
src/BSP.hs
gpl-2.0
readLeaf :: Array Int Int -> Array Int BSPFace -> Array Int Int -> Array Int BSPBrush ->Ptr a ->IO (BSPLeaf) readLeaf leafFaceArray faceArray leafBrushArray brushArray ptr = do [e1,e2,e3,e4,e5,e6,e7,e8,e9,e10,e11,e12] <- getInts ptr 12 let leafIndices = map (leafFaceArray !) [((e9+e10)-1),((e9+e10)-2)..e9] let faceList = map (faceArray !) leafIndices let brushIndices = map (leafBrushArray !) [e11..(e11+e12-1)] let brushList = map (brushArray !) brushIndices return $ BSPLeaf { cluster = e1, area = e2, leafMin = (realToFrac e3, realToFrac e5, realToFrac ((-1)*e4)), leafMax = (realToFrac e6, realToFrac e8, realToFrac ((-1)*e7)), leafface = e9, numOfLeafFaces = e10, leafBrush = e11, numOfLeafBrushes = e12, leafFaces = faceList, leafBrushes = brushList } -- - - - - - - - - - - - - - - - - - - -- huge function for reading the faces in our leaves
1,183
readLeaf :: Array Int Int -> Array Int BSPFace -> Array Int Int -> Array Int BSPBrush ->Ptr a ->IO (BSPLeaf) readLeaf leafFaceArray faceArray leafBrushArray brushArray ptr = do [e1,e2,e3,e4,e5,e6,e7,e8,e9,e10,e11,e12] <- getInts ptr 12 let leafIndices = map (leafFaceArray !) [((e9+e10)-1),((e9+e10)-2)..e9] let faceList = map (faceArray !) leafIndices let brushIndices = map (leafBrushArray !) [e11..(e11+e12-1)] let brushList = map (brushArray !) brushIndices return $ BSPLeaf { cluster = e1, area = e2, leafMin = (realToFrac e3, realToFrac e5, realToFrac ((-1)*e4)), leafMax = (realToFrac e6, realToFrac e8, realToFrac ((-1)*e7)), leafface = e9, numOfLeafFaces = e10, leafBrush = e11, numOfLeafBrushes = e12, leafFaces = faceList, leafBrushes = brushList } -- - - - - - - - - - - - - - - - - - - -- huge function for reading the faces in our leaves
1,182
readLeaf leafFaceArray faceArray leafBrushArray brushArray ptr = do [e1,e2,e3,e4,e5,e6,e7,e8,e9,e10,e11,e12] <- getInts ptr 12 let leafIndices = map (leafFaceArray !) [((e9+e10)-1),((e9+e10)-2)..e9] let faceList = map (faceArray !) leafIndices let brushIndices = map (leafBrushArray !) [e11..(e11+e12-1)] let brushList = map (brushArray !) brushIndices return $ BSPLeaf { cluster = e1, area = e2, leafMin = (realToFrac e3, realToFrac e5, realToFrac ((-1)*e4)), leafMax = (realToFrac e6, realToFrac e8, realToFrac ((-1)*e7)), leafface = e9, numOfLeafFaces = e10, leafBrush = e11, numOfLeafBrushes = e12, leafFaces = faceList, leafBrushes = brushList } -- - - - - - - - - - - - - - - - - - - -- huge function for reading the faces in our leaves
1,062
false
true
0
16
467
379
207
172
null
null
BradLyman/ubuntu-setup
xmonad/xmonad.hs
mit
myFocusFollowsMouse = False
27
myFocusFollowsMouse = False
27
myFocusFollowsMouse = False
27
false
false
0
4
2
6
3
3
null
null
jutaro/rdf4h
testsuite/tests/Data/RDF/GraphTestUtils.hs
bsd-3-clause
ldiff :: Triples -> Triples -> Triples ldiff l1 l2 = Set.toList $(Set.fromList l1) `Set.difference` Set.fromList l2
115
ldiff :: Triples -> Triples -> Triples ldiff l1 l2 = Set.toList $(Set.fromList l1) `Set.difference` Set.fromList l2
115
ldiff l1 l2 = Set.toList $(Set.fromList l1) `Set.difference` Set.fromList l2
76
false
true
0
9
16
56
26
30
null
null
fizzoo/launchpad-alsa
src/System/MIDI/LaunchpadALSA/Extra.hs
mit
keepLighting :: App keepLighting lp = forever $ resetAndLightOnKey lp
69
keepLighting :: App keepLighting lp = forever $ resetAndLightOnKey lp
69
keepLighting lp = forever $ resetAndLightOnKey lp
49
false
true
0
6
9
21
10
11
null
null
Brightgalrs/con-lang-gen
src/Out/Phonology.hs
mit
writeConPhonemeInventory_ :: [Phoneme] -> Airstream -> Text writeConPhonemeInventory_ cns airstream = "<br>\n<table border=1>" ++ tHeader ++ pLabels ++ clusters ++ "\n</table>\n" where cns_ = filter (\x -> airstream == getAirstream x) cns places = sort $ ordNub $ map getPlace cns_ manners = sort $ ordNub $ map getManner cns_ phonations = sort $ ordNub $ map getVoice cns_ tHeader = "\n\t<tr>\n\t\t<th colspan=\"" ++ tshow (length places * length phonations + 1) ++ "\">" ++ tshow airstream ++ " Consonants</th>\n\t</tr>" pLabels = "\n\t<tr>\n\t\t<th></th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">" ++ intercalate ("</th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">") (map tshow places) ++ "</th>\n\t</tr>" clusters = concatMap (makeRow cns airstream places phonations) manners
823
writeConPhonemeInventory_ :: [Phoneme] -> Airstream -> Text writeConPhonemeInventory_ cns airstream = "<br>\n<table border=1>" ++ tHeader ++ pLabels ++ clusters ++ "\n</table>\n" where cns_ = filter (\x -> airstream == getAirstream x) cns places = sort $ ordNub $ map getPlace cns_ manners = sort $ ordNub $ map getManner cns_ phonations = sort $ ordNub $ map getVoice cns_ tHeader = "\n\t<tr>\n\t\t<th colspan=\"" ++ tshow (length places * length phonations + 1) ++ "\">" ++ tshow airstream ++ " Consonants</th>\n\t</tr>" pLabels = "\n\t<tr>\n\t\t<th></th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">" ++ intercalate ("</th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">") (map tshow places) ++ "</th>\n\t</tr>" clusters = concatMap (makeRow cns airstream places phonations) manners
823
writeConPhonemeInventory_ cns airstream = "<br>\n<table border=1>" ++ tHeader ++ pLabels ++ clusters ++ "\n</table>\n" where cns_ = filter (\x -> airstream == getAirstream x) cns places = sort $ ordNub $ map getPlace cns_ manners = sort $ ordNub $ map getManner cns_ phonations = sort $ ordNub $ map getVoice cns_ tHeader = "\n\t<tr>\n\t\t<th colspan=\"" ++ tshow (length places * length phonations + 1) ++ "\">" ++ tshow airstream ++ " Consonants</th>\n\t</tr>" pLabels = "\n\t<tr>\n\t\t<th></th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">" ++ intercalate ("</th>\n\t\t<th colspan=\"" ++ tshow (length phonations) ++ "\">") (map tshow places) ++ "</th>\n\t</tr>" clusters = concatMap (makeRow cns airstream places phonations) manners
763
false
true
0
15
127
253
126
127
null
null
ygale/yesod
yesod-form/Yesod/Form/I18n/Czech.hs
mit
czechFormMessage MsgInvalidTimeFormat = "Neplatný čas, musí být ve formátu HH:MM[:SS]"
86
czechFormMessage MsgInvalidTimeFormat = "Neplatný čas, musí být ve formátu HH:MM[:SS]"
86
czechFormMessage MsgInvalidTimeFormat = "Neplatný čas, musí být ve formátu HH:MM[:SS]"
86
false
false
0
5
9
9
4
5
null
null
dolio/vector
Data/Vector/Primitive.hs
bsd-3-clause
foldM_ = G.foldM_
17
foldM_ = G.foldM_
17
foldM_ = G.foldM_
17
false
false
1
6
2
12
4
8
null
null