about summary refs log tree commit diff
path: root/users/Profpatsch/reverse-haskell-deps/ReverseHaskellDeps.hs
blob: 0e18ce8a6b371cba3714c4f7a8e4ed2aac69696c (plain) (blame)
1
2
3
4
5
6
7
8
9
10
11
12
13
14
15
16
17
18
19
20
21
22
23
24
25
26
27
28
29
30
31
32
33
34
35
36
37
38
39
40
41
42
43
44
45
46
47
48
49
50
51
52
53
54
55
56
57
58
59
60
61
62
63
64
65
66
67
68
69
70
71
72
73
74
75
76
{-# LANGUAGE LambdaCase #-}
{-# LANGUAGE MultiWayIf #-}
{-# LANGUAGE OverloadedStrings #-}
{-# LANGUAGE ScopedTypeVariables #-}

module Main where

import Data.ByteString qualified as ByteString
import Data.Either
import Data.List qualified as List
import Data.Maybe
import Data.Text (Text)
import Data.Text qualified as Text
import Data.Text.Encoding qualified
import MyPrelude
import Numeric.Natural
import Text.HTML.TagSoup qualified as Tag
import Text.Nicify
import Text.Read qualified as Read

parseNat :: Text -> Maybe Natural
parseNat = Read.readMaybe . textToString

printNice :: Show a => a -> IO ()
printNice = putStrLn . nicify . show

type Tag = Tag.Tag Text

main = do
  reverseHtml <- readStdinUtf8
  printNice $ List.sortOn snd $ packagesAndReverseDeps reverseHtml
  where
    readStdinUtf8 = bytesToTextUtf8Lenient <$> ByteString.getContents

-- | reads the table provided by https://packdeps.haskellers.com/reverse
-- figuring out all sections (starting with the link to the package name),
-- then figuring out the name of the package and the first column,
-- which is the number of reverse dependencies of the package
packagesAndReverseDeps :: Text -> [(Text, Natural)]
packagesAndReverseDeps reverseHtml = do
  let tags = Tag.parseTags reverseHtml
  let sections = Tag.partitions (isJust . reverseLink) tags
  let sectionName [] = "<unknown section>"
      sectionName (sect : _) = sect & reverseLink & fromMaybe "<unknown section>"
  let sectionNames = map sectionName sections
  mapMaybe
    ( \(name :: Text, sect) -> do
        reverseDeps <- firstNaturalNumber sect
        pure (sectionPackageName name sect, reverseDeps) :: Maybe (Text, Natural)
    )
    $ zip sectionNames sections
  where
    reverseLink = \case
      Tag.TagOpen "a" attrs -> findMaybe attrReverseLink attrs
      _ -> Nothing

    attrReverseLink = \case
      ("href", lnk) ->
        if
            | "packdeps.haskellers.com/reverse/" `Text.isInfixOf` lnk -> Just lnk
            | otherwise -> Nothing
      _ -> Nothing

    sectionPackageName :: Text -> [Tag] -> Text
    sectionPackageName sectionName = \case
      (_ : Tag.TagText name : _) -> name
      (_ : el : _) -> sectionName
      xs -> sectionName

    firstNaturalNumber :: [Tag] -> Maybe Natural
    firstNaturalNumber =
      findMaybe
        ( \case
            Tag.TagText t -> parseNat t
            _ -> Nothing
        )