【期末報告】台大管理學院的迷思

組員: 工管四 吳蔚平 / 工管四 林哲彣 / 會計四 郭書瑋 / 會計四 禹翔仁

library(png)
library(grid)
img <- readPNG("cover.png")
## Warning in readPNG("cover.png"): libpng warning: iCCP: known incorrect sRGB
## profile
 grid.raster(img, just = "center")

迷思一、台大管理學院的學生的學生都不讀研究所?? 薪水都比理工科的學生低??

#update.packages("dplyr")
#library(dplyr)
#library(ggplot2)
# install.packages("ggplot")
# library(ggplot)
library(plotly)
## Warning: package 'plotly' was built under R version 3.3.3
## Loading required package: ggplot2
## Warning: package 'ggplot2' was built under R version 3.3.3
## 
## Attaching package: 'plotly'
## The following object is masked from 'package:ggplot2':
## 
##     last_plot
## The following object is masked from 'package:stats':
## 
##     filter
## The following object is masked from 'package:graphics':
## 
##     layout
library(data.table)
require(stats)

pathMaster <- "D:/R/HW4/master.csv"
master_data <- read.table(pathMaster, header = TRUE, sep = ",")

df <- data.frame(
  group = c("文學院","理學院","社會科學院","醫學院","工學院","生物資源暨農學院","管理學院","公共衛生學院","電機資訊學院","法律學院","生命科學院"),
  value = master_data$碩士總數)

#pie chart
bp<- ggplot(df, aes(x="", y=value, fill=group))+
  geom_bar(width = 1, stat = "identity")

pie <- bp + coord_polar("y", start=0)
pie

上圖為 2014 年台大各學院碩士生占比圓餅圖。由圖中可知,管理學院的碩士占比位居第三。但無法推翻假說,因為此圓餅圖為 各學院碩士生 / 整體碩士生 求得,管理學院可能大多由非管院大學部學生就讀。

目前管理學院的現況是大部分的同學不會繼續攻讀研究所。綜合現況與上圖可以推知就讀管院研究所大多為非原科系學生,與理工學院就讀研究所狀況大不相同。那麼是何項原因造成這項結果呢?我們推論薪資因素為主要操控因子。

# Master: Management
df <- data.frame(
  group = c("60,001元以上", "40,001元至60,000元", "31,001元至40,000元", "31,000元以下"),
  value = c(0.4718,0.4769,  0.0462, 0.0051))

bp<- ggplot(df, aes(x="", y=value, fill=group))+
  geom_bar(width = 1, stat = "identity")

pie <- bp + coord_polar("y", start=0)
pie + scale_fill_brewer(palette="Greens")

#Bachelor: Management
df2 <- data.frame(
  group = c("50001以上", "40001至50000", "30001至40000", "31,000元以下"),
  value = c(0.3011,0.3068,0.3466,0.0455))

bp<- ggplot(df2, aes(x="", y=value, fill=group))+
  geom_bar(width = 1, stat = "identity")

pie <- bp + coord_polar("y", start=0)
pie + scale_fill_brewer(palette="Greens")

【台大管理學院碩士 / 學士就業薪資比較 】

由上兩張圖(2014 年數據)可知,攻讀管理學院研究所的薪資相較大學部也是大幅上升。但由於不能確定研究所學生是來自於台大管院學生,因此迷思無法破解。只能說台大管院研究所與大學部畢業對於薪資是有顯著影響的。

接者比較理工科學生大學部研究所畢業的差距。

# Master: 理工
df <- data.frame(
  group = c("60,001元以上", "40,001元至60,000元", "31,001元至40,000元", "31,000元以下","其他(不願提供薪資或拒答)"),
  value = c(0.8839, 1.6345, 0.365,  0.0974, 0.0194))

bp<- ggplot(df, aes(x="", y=value, fill=group))+
  geom_bar(width = 1, stat = "identity")

pie <- bp + coord_polar("y", start=0)
pie+ scale_fill_brewer(palette="Blues")

#Bachelor: 理工
df2 <- data.frame(
  group = c("50001以上", "40001至50000", "30001至40000", "31,000元以下","其他(不願提供薪資或拒答)"),
  value = c(0.8451, 0.754,  0.8325, 0.556,0.0124))

bp<- ggplot(df2, aes(x="", y=value, fill=group))+
  geom_bar(width = 1, stat = "identity")

pie <- bp + coord_polar("y", start=0)
pie+ scale_fill_brewer(palette="Blues")

【台大理工科碩士 / 學士就業薪資比較 】 上圖為台大理工科系(理學院、工學院、電資學院加總)研究所與大學部的就業薪資圓餅圖。 → 薪資差距相當巨大,可以證明為何台大理工科學生幾乎會選擇繼續攻讀研究所。

迷思二、管院的交換生比其他學院高??

rawdata = read.csv('D:/R/HW3/exchange.csv',header = TRUE,stringsAsFactors=FALSE)

# incoming 
answer01 <- local({
  slice(rawdata, 2:22) 
})
colnames(answer01) <- c("Year","Total_In","文學院In","理學院In","社會科學院In","醫學院In","工學院In","農學院In","管理學院In","公衛學院In","電資學院In","法律學院In","生命科學院In")
rownames(answer01) <- 1:nrow(answer01)

# change NA into 0
answer01[is.na(answer01)] <- 0
for ( ii in c("Total_In","文學院In","理學院In","社會科學院In","醫學院In","工學院In","農學院In","管理學院In","公衛學院In","電資學院In","法律學院In","生命科學院In")){
     answer01[[ii]] <- as.numeric(answer01[[ii]])
}
# rate為管理學院佔全部交換生比例
for ( ii in c("Total_In","文學院In","理學院In","社會科學院In","醫學院In","工學院In","農學院In","管理學院In","公衛學院In","電資學院In","法律學院In","生命科學院In")){
  answer01[[ii]] <- as.numeric(answer01[[ii]])
  for (jj in 1:21){
    rate_In <- answer01$管理學院In[jj] / answer01$Total[jj] # calculate the rate of management / total
    answer01[["rate_in"]][jj] = rate_In
  }
}

# 刪除NA
answer01 <- na.omit(answer01)

lastyearId = length(answer01$Year)
firstYear = as.numeric(answer01$Year[1])
lastYear = as.numeric(answer01$Year[lastyearId])
n = lastYear - firstYear + 1
allType = names(answer01)
rownames(answer01) <- 1:nrow(answer01)

typeId = c(3:13)
newTable = data.frame()

for( nid in c(2:n) )
{
  year = as.matrix(rep(answer01$Year[nid], length(answer01[nid,typeId])))
  people = as.matrix(as.numeric(answer01[nid,typeId]))
  type = as.matrix(as.character(allType[typeId]))
  temp = cbind(year, people, type)
  newTable = rbind(newTable, temp)
}
names(newTable) = c('year', 'people', 'department')

#install.packages("colorRamps")
library(colorRamps)
#install.packages("RColorBrewer")
library(RColorBrewer)
colourCount = length(unique(mtcars$hp))
getPalette = colorRampPalette(brewer.pal(9, "Set1"))

p <- plot_ly(data = newTable, x = ~year, y = ~people, color = ~department, colors = getPalette(11)) %>%
  add_lines(yaxis = list(range=c(0:10)))
p

將台大所有系所的交換學生依據年度進行比較,看出管理學院交換學生的數量的確大幅高於其他學院,且近幾年更是大幅成長。

# 選出2013年的資料
piein <- local({
  slice(answer01, 20:21) 
})
aa <- c(piein$文學院, piein$理學院, piein$社會科學院, piein$醫學院, piein$工學院, piein$農學院, piein$管理學院, piein$公衛學院, piein$電資學院, piein$法律學院, piein$生命科學院)
names(aa) <- c("文學院", "理學院", "社會科學院","醫學院","工學院", "農學院", "管理學院", "公衛學院", "電資學院", "法律學院", "生命科學院")
pie(aa, col = rainbow(24))

以上圓餅圖則是呈現 2013 年台大交換學生的分布比例,也可以進一步證明近幾年管理學院的交換生人數位居台大各大院所最高。

迷思三、管院的妹子真的多嗎?

大家都說,管院有著滿~山~滿~谷的妹子 然而,管院的男女比真的是在台大各院裡面名列前茅的嗎?
我們分析了2004-2016總共13年的各院以及管院五系的男女比例,
男女比計算方式為「女性人數 / 男性人數」

以下是我們的圖表:

g.data <- read.csv("D:/R/Final/gender2.csv")
#head(g.data)

library(plotly)

g.chart <- plot_ly(data = g.data , x = ~year, y = ~gender , color = ~dept) %>%
  add_lines(yaxis = list(range=c(0:10)))

g2.data <- subset(g.data , dept == "管理學院" | dept == "公衛學院" | dept == "社會科學院" | dept == "法律學院" | dept == "文學院" )
g2.chart <- plot_ly(data = g2.data , x = ~year, y = ~gender , color = ~dept) %>% add_lines(yaxis = list(range=c(0:10)))

g3.data <- subset(g.data , dept == "管理學院" | dept == "管院扣資管" | dept == "公衛學院" | dept == "社會科學院" | dept == "法律學院" | dept == "文學院" )
g3.chart <- plot_ly(data = g3.data , x = ~year, y = ~gender , color = ~dept) %>% add_lines(yaxis = list(range=c(0:10)))

g4.data <- subset(g.data , dept == "管理學院" | dept == "管院扣資管" )
g4.chart <- plot_ly(data = g4.data , x = ~year, y = ~gender , color = ~dept) %>% add_lines(yaxis = list(range=c(0:10)))

g5.data <- subset(g.data , dept == "管理學院" | dept == "會計系" | dept == "國企系" | dept == "工管系" | dept == "財金系"| dept == "資管系" )
g5.chart <- plot_ly(data = g5.data , x = ~year, y = ~gender , color = ~dept) %>% add_lines(yaxis = list(range=c(0:10)))

表一 : 台大各院及管院五系之性別比總表

g.chart
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

再把高於管院性別比的院給挑出來,得出下圖

表二 : 性別比前五名

g2.chart
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

由上表可以知道,性別比的排名基本上是
1.文學院(第一名獨走)
2.公衛學院
3.社科學院
4.法律學院(與社科院不相上下)
5.管理學院(在2009年後即低於法律學院)

由此可知,在台大11個學院當中排名第五,屬於中段班的成員 關於台大管院妹子比例是台大名列前茅的流言 — 破解!!

咦? 等等,你們說管院可能是資管系把性別比拉低的? 那我們就繼續來看看是不是真的吧!
我們將管院扣掉資管系的同學並再計算性別比之後,得出下表

表三 : 台大各院及管院五系(含扣掉資管)之性別比總表

g3.chart
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

看起來似乎不相上下哦?
我們再將管院及扣掉資管之後的管院拉出來比較,見下表:

表四 : 台大管院性別比 vs 台大管院扣掉資管系後之性別比

g4.chart
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

燈愣,我們發現一個驚人的事實!
在2012前,少了資管系的管院性別比反而是高於整個管院非常多的
資管系其實不是拉低管院性別比的元兇!
大家真的誤會他們啦~

因此,我們又有了一個疑問,既然不是資管系讓我們在2009年之後掉出「性別比的前段班」
那究竟是什麼系出了問題呢?
於是我們再拉出一張管院及管院五系的折線圖來看看:

表五 : 管院五系性別比

g5.chart
## Warning in RColorBrewer::brewer.pal(N, "Set2"): n too large, allowed maximum for palette Set2 is 8
## Returning the palette you asked for with that many colors

從上表可以發現,財金系在近幾年的性別比呈現節節敗退的狀況
於是我們決定使用迴歸分析來判斷是否是不是財金系才是影響管院性別比的元兇

究竟誰是元兇?

fin.gender <- subset(g.data , dept == "財金系" , select= gender )
im.gender <- subset(g.data , dept == "資管系" , select= gender )
com.gender <- subset(g.data , dept == "管理學院" , select= gender )

##財金系與管院性別比之相關係數
cor(com.gender , fin.gender)
##           gender
## gender 0.7130391
##資管系與管院性別比之相關係數
cor(com.gender , im.gender)
##           gender
## gender 0.2366894

我們發現了財金系是這十幾年來左右管院性別比高低的主因!
綜上所述,本節的研究得出以下結論:
1.管院的性別比在台大各院不是前段班
2.資管系不完全是降低管院性別比的主因
3.財金系是這幾年左右管院性別比的重要因素!

#install.packages("devtools")
library(devtools)
## Warning: package 'devtools' was built under R version 3.3.3
#install.packages("ggplot2")
#install.packages("ggmap")
library(ggplot2)
library(ggmap)
## Warning: package 'ggmap' was built under R version 3.3.3
## 
## Attaching package: 'ggmap'
## The following object is masked from 'package:plotly':
## 
##     wind
library(mapproj)
## Warning: package 'mapproj' was built under R version 3.3.3
## Loading required package: maps
## Warning: package 'maps' was built under R version 3.3.3
ntu_management <- c(25.013993, 121.538106) # 管院
ntu_socialscience <- c(25.020538, 121.542366) # 社科
ntu_law <- c(25.020503, 121.543597) # 法律 
ntu_EE <- c(25.019035, 121.538761) # 電機
ntu_g <- c(25.018907, 121.540226) # 工學院
ntu_info <- c(25.019424, 121.541551) # 資工
ntu_word <- c(25.017924, 121.536747) # 文學
data <- c(0.904, 1.148, 1.131,0.148,0.260, 0.125, 2.003)
lon <- rbind(ntu_management[2], ntu_socialscience[2], ntu_law[2], ntu_EE[2], ntu_g[2], ntu_info[2], ntu_word[2])
lat <- rbind(ntu_management[1], ntu_socialscience[1], ntu_law[1], ntu_EE[1], ntu_g[1], ntu_info[1], ntu_word[1])

ntuData = data.frame(lon, lat,data)
ntuData
##        lon      lat  data
## 1 121.5381 25.01399 0.904
## 2 121.5424 25.02054 1.148
## 3 121.5436 25.02050 1.131
## 4 121.5388 25.01903 0.148
## 5 121.5402 25.01891 0.260
## 6 121.5416 25.01942 0.125
## 7 121.5367 25.01792 2.003
map <- get_map(location = 'national taiwan university', zoom = 16, language = "zh-TW")
## Map from URL : http://maps.googleapis.com/maps/api/staticmap?center=national+taiwan+university&zoom=16&size=640x640&scale=2&maptype=terrain&language=zh-TW&sensor=false
## Information from URL : http://maps.googleapis.com/maps/api/geocode/json?address=national%20taiwan%20university&sensor=false
#ggmap(map)

ggmap(map) + 
  geom_point(aes(x = lon, y = lat,  size = data), data = ntuData, color = "red")

迷思四:管院GPA很好拿?? 大家都說管院課躺著過,輕鬆拿高分簡單畢業, 我們利用爬蟲將 http://ntusweety.herokuapp.com/ 近年課程、GPA的歷史紀錄爬下來存到course.txt, 第一步將檔案讀進來

course.path <- "D:/R/Final/course.txt"
readBin(course.path, what = "raw", n = 3)
## [1] 39 37 30
readLines(file(course.path, encoding = "UTF-8"), n = 5)
## [1] "97020\t002\t柔道初級\t3.69\t黃國恩\thttp://ntusweety.herokuapp.com/history?&id=002+50440&cl=22"
## [2] "97023\t002\t手球中級\t3.93\t黃欽永\thttp://ntusweety.herokuapp.com/history?&id=002+50570&cl=16"
## [3] "97032\t002\t游泳初級\t3.63\t許君恆\thttp://ntusweety.herokuapp.com/history?&id=002+50630&cl=D5"
## [4] "97033\t002\t游泳初級\t3.85\t許君恆\thttp://ntusweety.herokuapp.com/history?&id=002+50630&cl=D6"
## [5] "97034\t002\t游泳初級\t3.7\t林怡秀\thttp://ntusweety.herokuapp.com/history?&id=002+50630&cl=F8"
info <- file.info(course.path)
course.bin <- readBin(course.path, what = "raw", n = info$size)
library(stringi)
course.txt <- stri_encode(course.bin, "UTF-8", "UTF-8")
get_text_connection_by_l10n_info <- function(x) {
  info <- l10n_info()
  if (info$MBCS & !info$`UTF-8`) {
    textConnection(x)
  } else {
    textConnection(x, encoding = "UTF-8")
  }
}
course <- read.table(get_text_connection_by_l10n_info(course.txt), header = FALSE, sep = "\t")
colnames(course) <- c("class.num", "department.num", "course","avgGPA", "prof.","href")

表六:課程成績資料表

course
##      class.num department.num                                   course
## 1        97020            002                                 柔道初級
## 2        97023            002                                 手球中級
## 3        97032            002                                 游泳初級
## 4        97033            002                                 游泳初級
## 5        97034            002                                 游泳初級
## 6        97042            002                               田徑與慢跑
## 7        97044            002                                 羽球初級
## 8        97045            002                                 羽球初級
## 9        97046            002                                 羽球初級
## 10       97047            002                                 羽球初級
## 11       97048            002                                 羽球初級
## 12       97049            002                                 羽球初級
## 13       97050            002                                 羽球初級
## 14       97051            002                                 羽球初級
## 15       97052            002                                 羽球初級
## 16       97053            002                                 羽球初級
## 17       97054            002                                 羽球初級
## 18       97059            002                                 羽球初級
## 19       97060            002                                 羽球初級
## 20       97066            002                                 羽球中級
## 21       97079            002                                 桌球初級
## 22       97080            002                                 桌球初級
## 23       97081            002                                 桌球初級
## 24       97090            002                                 桌球初級
## 25       97091            002                                 桌球初級
## 26       97093            002                                 排球初級
## 27       97112            002                                 籃球中級
## 28       97114            002                               高爾夫初級
## 29       97115            002                               高爾夫初級
## 30       97116            002                               高爾夫初級
## 31       97129            002                                 網球初級
## 32       97130            002                                 網球初級
## 33       97134            002                                 網球初級
## 34       97135            002                                 網球初級
## 35       97136            002                             網球中級(一)
## 36       97167            002                           氣功(選修體育)
## 37       11759            004                         進階英語二(綜合)
## 38       71108            004                         進階英語二(綜合)
## 39       83594            004                         進階英語二(綜合)
## 40       32312            004                         進階英語二(綜合)
## 41       57632            004                         進階英語二(綜合)
## 42       10146            004                         進階英語二(綜合)
## 43       30853            004                         進階英語二(聽力)
## 44       73744            004                         進階英語二(聽力)
## 45       51935            101                         中國傳統生命禮俗
## 46       86017            101                               國學導讀下
## 47       32897            101                               國學導讀下
## 48       41134            101                         中國歷史與文化下
## 49       84826            101                       現代中文及習作一下
## 50       87927            101                       現代中文及習作二下
## 51       52963            101                             現代散文選下
## 52       72738            101                             現代小說選下
## 53       33532            101                               文學概論下
## 54       16370            101                               文學概論下
## 55       88477            101                         初級中國文字學下
## 56       40825            101                               文字學乙下
## 57       84158            101                               文字學乙下
## 58       71373            101                           語言學概論甲下
## 59       44842            101                           語言學概論甲下
## 60       25912            101                                 四書甲下
## 61       50667            101                                 左傳乙下
## 62       64444            101                               國學概說下
## 63       59153            101                               歷代文選下
## 64       73116            101                         中國文學史概說二
## 65       47044            101                             中國文學史下
## 66       48445            101                             中國文學史下
## 67       26678            101                           中國文學史一下
## 68       84005            101                           中國文學史二下
## 69       55452            101                         歷代文選及習作下
## 70       36045            101                         歷代文選及習作下
## 71       19730            101                           詩選及習作甲下
## 72       58434            101                           詩選及習作甲下
## 73       46771            101                           音樂作品欣賞二
## 74       52172            101                               聲韻學甲下
## 75       16436            101                               聲韻學甲下
## 76       63966            101                                 詩經甲下
## 77       43195            101                                 尚書甲下
## 78       24354            101                                 禮記甲下
## 79       12942            101                                 老子甲下
## 80       48002            101                                 莊子甲下
## 81       67378            101                                 荀子甲下
## 82       78182            101                               歷代詩選下
## 83       39546            101                                 謝靈運詩
## 84       89318            101                                 小說選下
## 85       88142            101                                 楚辭甲下
## 86       64690            101                                 戲曲選下
## 87       84327            101                             詞選及習作下
## 88       12500            101                                 訓詁學下
## 89       73524            101                                 訓詁學下
## 90       64837            101                             中國思想史下
## 91       35380            101                             中國思想史下
## 92       53930            101                           華語教學法進階
## 93       44458            101                             漢語語言學下
## 94       46844            101                                   東坡詞
## 95       84453            101                             初級臺灣客語
## 96       52834            101                                   詩品下
## 97       27570            101                                   蒙文二
## 98       76351            101                                   清詞選
## 99       67400            101                                   藏文一
## 100      84988            101                                   藏文二
## 101      15335            101                                   滿文一
## 102      73933            101                                   滿文二
## 103      41556            101                     八思巴蒙古語文獻選讀
## 104      39892            102                           西洋文學概論二
## 105      32182            102                           西洋文學概論二
## 106      46168            102                           文學作品讀法下
## 107      13310            102                           文學作品讀法下
## 108      36429            102                           文學作品讀法下
## 109      56760            102                               期刊編寫一
## 110      65356            102                             語言學概論下
## 111      20016            102                             語言學概論下
## 112      61382            102                                 法文一下
## 113      26850            102                                 法文一下
## 114      87417            102                                 法文一下
## 115      21368            102                                 法文一下
## 116      40993            102                                 法文一下
## 117      43472            102                                 法文一下
## 118      68675            102                                 法文一下
## 119      70593            102                                 法文一下
## 120      38322            102                                 法文一下
## 121      20646            102                                 法文一下
## 122      85091            102                                 法文一下
## 123      61504            102                                 德文一下
## 124      72890            102                                 德文一下
## 125      71305            102                                 德文一下
## 126      42491            102                                 德文一下
## 127      23180            102                                 德文一下
## 128      46232            102                                 德文一下
## 129      58895            102                             西班牙文一下
## 130      14719            102                             西班牙文一下
## 131      74212            102                             西班牙文一下
## 132      39248            102                             西班牙文一下
## 133      13324            102                             西班牙文一下
## 134      70424            102                             西班牙文一下
## 135      77577            102                             西班牙文一下
## 136      48291            102                             西班牙文一下
## 137      12757            102                             西班牙文一下
## 138      45977            102                                 俄文一下
## 139      20598            102                                 俄文一下
## 140      79853            102                               拉丁文一下
## 141      86403            102                             阿拉伯文一下
## 142      37772            102                             阿拉伯文二下
## 143      56443            102                             古希臘文一下
## 144      10684            102                             義大利文一下
## 145      54927            102                             義大利文一下
## 146      65095            102                             葡萄牙文一下
## 147      62955            102                               荷蘭文一下
## 148      74347            102                             土耳其文一下
## 149      75301            102                               波蘭文一下
## 150      75179            102                           中世紀英國文學
## 151      43801            102                         十六世紀英國文學
## 152      66833            102                   十七與十八世紀英國文學
## 153      50711            102                         浪漫時期英國文學
## 154      15526            102                         二十世紀英國文學
## 155      36022            102                         歐洲文學1800以後
## 156      33015            102                         歐洲文學1800以後
## 157      84546            102                               小說選讀二
## 158      40674            102                               小說選讀二
## 159      13932            102                               小說選讀二
## 160      22544            102                               聖經選讀二
## 161      21865            102                 英語語音學(含發音練習)二
## 162      59514            102                         社會語言學概論二
## 163      22535            102                           翻譯與外語教學
## 164      57388            102                           新聞媒體與文化
## 165      85944            102                             翻譯及習作下
## 166      63303            102                             翻譯及習作下
## 167      67424            102                             翻譯及習作下
## 168      76651            102                             翻譯及習作下
## 169      44568            102                             翻譯及習作下
## 170      46374            102                             翻譯及習作下
## 171      26784            102                             翻譯及習作下
## 172      42567            102                             翻譯及習作下
## 173      68381            102                                 法文二下
## 174      35912            102                                 法文二下
## 175      13824            102                                 法文二下
## 176      87464            102                                 法文二下
## 177      34742            102                                 法文二下
## 178      71051            102                                 德文二下
## 179      28131            102                                 德文二下
## 180      80223            102                                 德文二下
## 181      17866            102                                 德文二下
## 182      42060            102                                 德文二下
## 183      40127            102                                 德文二下
## 184      68967            102                             西班牙文二下
## 185      21227            102                             西班牙文二下
## 186      81976            102                             西班牙文二下
## 187      33228            102                             西班牙文二下
## 188      28490            102                                 俄文二下
## 189      15650            102                               拉丁文二下
## 190      59631            102                             古希臘文二下
## 191      53587            102                             義大利文二下
## 192      51084            102                             葡萄牙文二下
## 193      72151            102                               荷蘭文二下
## 194      22738            102                               波蘭文二下
## 195      89528            102                             語言教學評量
## 196      49372            102                             希臘悲劇選讀
## 197      35147            102                           英語口語訓練三
## 198      47569            102                                 法文三下
## 199      81231            102                                 德文三下
## 200      75829            102                                 德文三下
## 201      17578            102                                 德文三下
## 202      76166            102                             西班牙文三下
## 203      56490            102                             西班牙文三下
## 204      31092            102                     法語發音與聽力訓練二
## 205      65927            102                                 俄文三下
## 206      79096            102                                 德文四下
## 207      78931            102                                 德文四下
## 208      81451            102                             西班牙文四下
## 209      68604            102                             早期美國文學
## 210      70847            102                         十九世紀美國文學
## 211      41194            102                         二十世紀美國文學
## 212      52943            102                             西洋歌劇史二
## 213      87326            102                               戲劇選讀二
## 214      23933            102                               戲劇選讀二
## 215      33823            102                         文學、動物與社會
## 216      89804            102                           德國文化概述下
## 217      73304            102                         伊斯蘭歷史與文化
## 218      58500            102                             英文作文一下
## 219      48212            102                             英文作文一下
## 220      48330            102                             英文作文一下
## 221      72589            102                             英文作文一下
## 222      39848            102                             英文作文一下
## 223      16022            102                             英文作文一下
## 224      34540            102                             英文作文一下
## 225      46994            102                             英文作文一下
## 226      23771            102                             英文作文一下
## 227      11320            102                             英文作文一下
## 228      52112            102                             英文作文二下
## 229      19196            102                             英文作文二下
## 230      44149            102                             英文作文二下
## 231      81055            102                             英文作文二下
## 232      62139            102                             英文作文二下
## 233      39455            102                             英文作文二下
## 234      57527            102                             英文作文二下
## 235      28612            102                             英文作文二下
## 236      45793            102                             英文作文二下
## 237      13464            102                             英文作文三下
## 238      27384            102                             英文作文三下
## 239      21964            102                             英文作文三下
## 240      18847            102                             英文作文三下
## 241      16843            102                           口語與聽力訓練
## 242      22915            102                         英語口語訓練一下
## 243      66836            102                         英語口語訓練一下
## 244      41845            102                         英語口語訓練一下
## 245      50885            102                         英語口語訓練一下
## 246      24731            102                         英語口語訓練一下
## 247      38936            102                         英語口語訓練一下
## 248      47406            102                         英語口語訓練一下
## 249      78851            102                         英語口語訓練一下
## 250      17508            102                         英語口語訓練二下
## 251      68868            102                         英語口語訓練二下
## 252      56196            102                         英語口語訓練二下
## 253      74390            102                         英語口語訓練二下
## 254      15637            102                         英語口語訓練二下
## 255      30372            102                         英語口語訓練二下
## 256      14585            102                         英語口語訓練二下
## 257      72053            102                         英語口語訓練二下
## 258      50191            102                         英語口語訓練二下
## 259      82411            102                                   中翻英
## 260      55368            102                                   中翻英
## 261      75523            102                           公文、法規翻譯
## 262      16600            102                                     視譯
## 263      27717            102                               逐步口譯二
## 264      46481            102                               逐步口譯二
## 265      53183            102                               逐步口譯二
## 266      79011            102                                 同步口譯
## 267      38758            102                                 科技翻譯
## 268      60716            102                                 影視翻譯
## 269      27101            102                                 會議英語
## 270       3015            102                     英文(附二小時英聽)二
## 271       3070            102                     英文(附二小時英聽)二
## 272       3047            102                     英文(附二小時英聽)二
## 273       3048            102                     英文(附二小時英聽)二
## 274       3058            102                     英文(附二小時英聽)二
## 275       3059            102                     英文(附二小時英聽)二
## 276       3025            102                     英文(附二小時英聽)二
## 277       3016            102                     英文(附二小時英聽)二
## 278       3017            102                     英文(附二小時英聽)二
## 279       3060            102                     英文(附二小時英聽)二
## 280      53937            103                                 學士論文
## 281      76133            103                               專題討論二
## 282      14206            103                               專題討論二
## 283      68466            103                               專題討論二
## 284      88974            103                               專題討論二
## 285      36115            103                               專題討論二
## 286      36636            103                               專題討論二
## 287      10942            103                                 世界史四
## 288      18404            103                                 中國史四
## 289      47603            103                                   史記三
## 290      80237            103                             中國史學史下
## 291      86108            103                         歷史、醫療與社會
## 292      41580            103                             歷史的轉捩點
## 293      24256            103                           王權與近代國家
## 294      51727            103                           臺灣歷史與人物
## 295      17254            103                 清代臺灣的移民開發與社會
## 296      28036            103                    日本通史(原史-幕末)下
## 297      61032            103                         台灣女性人物群像
## 298      35819            103                           日本封建時代史
## 299      11538            103                 中國傳統法律、文化與社會
## 300      43684            103                現代中國與世界:1911-1979
## 301      73846            103                               戰後台灣史
## 302      55659            103                   近代歐洲社會與閱讀文化
## 303      69788            103                       戰後臺灣民主運動史
## 304      31961            103                     資治通鑑選讀-南北朝
## 305      13002            103                     探索台灣殖民都市空間
## 306      50297            103                               東亞現代史
## 307      44518            103                         日本近代歷史人物
## 308      44333            103                         日本近代歷史人物
## 309      31612            104                             佛教經論選讀
## 310      26575            104                         哲學推理與倫理學
## 311      84800            104                                 哲學概論
## 312      11191            104                                 哲學概論
## 313      35486            104                                 哲學概論
## 314      61694            104                                 哲學概論
## 315      29101            104                                 哲學概論
## 316      74442            104                                     邏輯
## 317      56654            104                                     邏輯
## 318      23656            104                             先秦道家哲學
## 319      41815            104                                 老子哲學
## 320      44736            104                                 莊子哲學
## 321      76230            104                               詮釋學導論
## 322      22286            104                                   倫理學
## 323      15248            104                             西洋哲學史二
## 324      87512            104                             中國哲學史二
## 325      30793            104                             當代歐陸哲學
## 326      50158            104                                 哲學英文
## 327      20580            104                                   知識論
## 328      73331            104                                   形上學
## 329      62512            104                               現象學導論
## 330      39428            105                               世界民族誌
## 331      76243            105                             文化人類學丙
## 332      53232            105                                 史前史二
## 333      59942            105                               體質人類學
## 334      69626            105                                   語言學
## 335      40952            105                                 考古學史
## 336      43982            105                               人類學史一
## 337      95012            105                             博物館學概論
## 338      59939            105                     文化田野實習與方法下
## 339      47558            105                     考古田野實習與方法下
## 340      57879            105                               台灣考古學
## 341      70181            105                               中國考古學
## 342      87476            105                             大洋洲民族誌
## 343      40230            105                               都市人類學
## 344      56371            105                       文化資產與材料分析
## 345      45457            105                               陌生人研究
## 346      63840            105                       政治人類學當代議題
## 347      26845            105                     臺灣原住民族當代議題
## 348      29676            106                             資訊科學導論
## 349      73222            106                       圖書資訊機構實務二
## 350      34515            106                               普通心理學
## 351      49014            106                           電子計算機概論
## 352      36140            106                               資訊組織二
## 353      52543            106                               專門圖書館
## 354      18675            106                                 館藏發展
## 355      71118            106                   社會科學資訊資源與服務
## 356      68243            106                               資訊心理學
## 357      56396            106                               專題研究二
## 358      20190            106                               專題研究二
## 359      70749            106                               專題研究二
## 360      27377            106                               專題研究二
## 361      15161            106                               專題研究二
## 362      32796            106                               專題研究一
## 363      85229            106                               專題研究一
## 364      28039            106                               專題研究一
## 365      24543            106                               專題研究一
## 366      24079            106                               專題研究一
## 367      54851            106                               專題研究一
## 368      31826            106                               專題研究一
## 369      14857            106                               專題研究一
## 370      47862            106                               專題研究一
## 371      67933            106                               專題研究一
## 372      35949            106                       圖書館人力資源管理
## 373      37714            106                             圖書資訊法規
## 374      50864            106                             政府資訊資源
## 375      80621            106                       研究方法與論文寫作
## 376      72613            106                                 兒童讀物
## 377      57006            106                               數位圖書館
## 378      50910            107                               初級日語下
## 379      70745            107                             日語會話一下
## 380      11753            107                             日語會話一下
## 381      27129            107                             日語會話一下
## 382      38490            107                             日文習作一下
## 383      47141            107                             日文習作一下
## 384      15999            107                             日文習作一下
## 385      63013            107                           日語聽講實習下
## 386      81646            107                           日語聽講實習下
## 387      59702            107                           日語聽講實習下
## 388      24697            107                                 商用日文
## 389      80944            107                               中級日語下
## 390      10423            107                               中級日語下
## 391      62630            107                             日語會話二下
## 392      73917            107                             日語會話二下
## 393      76338            107                             日語會話二下
## 394      20157            107                               日語語法下
## 395      63211            107                             日文習作二下
## 396      68040            107                             日文習作二下
## 397      43533            107                             日文習作二下
## 398      15052            107                             日文翻譯一下
## 399      54500            107                             日文翻譯一下
## 400      69731            107                             日文翻譯一下
## 401      80150            107                           日本童話選讀下
## 402      55666            107                                 日文一下
## 403      20217            107                                 日文一下
## 404      32125            107                                 日文一下
## 405      47429            107                                 日文一下
## 406      79340            107                                 日文一下
## 407      24698            107                                 日文一下
## 408      64871            107                                 日文一下
## 409      27623            107                                 日文一下
## 410      21192            107                                 日文一下
## 411      75462            107                                 日文一下
## 412      45569            107                                 日文一下
## 413      14738            107                                 日文一下
## 414      26950            107                                 日文一下
## 415      13164            107                                 日文一下
## 416      16856            107                                 日文一下
## 417      76735            107                                 日文一下
## 418      77935            107                                 日文一下
## 419      39138            107                                 日文一下
## 420      51862            107                                 日文一下
## 421      89057            107                                 日文一下
## 422      45275            107                                 日文一下
## 423      10788            107                                 日文一下
## 424      62376            107                                 日文一下
## 425      24811            107                                 日文一下
## 426      45726            107                                 日文一下
## 427      81483            107                                 日文一下
## 428      67091            107                                 日文一下
## 429      81981            107                                 日文一下
## 430      45182            107                                 日文一下
## 431      45038            107                                 日文一下
## 432      78676            107                                 日文一下
## 433      79737            107                                 日文一下
## 434      31138            107                                 日文一下
## 435      56525            107                                 日文一下
## 436      31481            107                                 日文一下
## 437      18953            107                                 日文一下
## 438      74244            107                                 日文一下
## 439      18969            107                                 日文一下
## 440      29302            107                                 日文一下
## 441      35127            107                                 日文一下
## 442      71473            107                                 日文一下
## 443      40045            107                                 日文一下
## 444      12172            107                                 日文一下
## 445      45712            107                                 日文一下
## 446      12084            107                                 日文一下
## 447      21850            107                                 日文一下
## 448      72127            107                                 日文一下
## 449      52064            107                                 日文一下
## 450      72764            107                                 日文一下
## 451      11838            107                                 日文一下
## 452      87204            107                                 日文一下
## 453      19776            107                         日本語言學概論下
## 454      79547            107                             日本文學史下
## 455      80596            107                       日本文學名著選讀下
## 456      46849            107                             日文翻譯二下
## 457      37913            107                             日文翻譯二下
## 458      47491            107                             日文翻譯二下
## 459      43979            107                               高級日語下
## 460      77478            107                               高級日語下
## 461      39212            107                             日文習作三下
## 462      77321            107                               日本歷史下
## 463      84329            107                           日本戲劇導讀下
## 464      25798            107                       日本思想名著選讀下
## 465      78698            107                                 日文二下
## 466      21966            107                                 日文二下
## 467      65199            107                                 日文二下
## 468      89300            107                                 日文二下
## 469      43140            107                                 日文二下
## 470      66425            107                                 日文二下
## 471      13812            107                                 日文二下
## 472      51528            107                                 日文二下
## 473      21068            107                                 日文二下
## 474      17428            107                                 日文二下
## 475      74152            107                                 日文二下
## 476      33731            107                                 日文二下
## 477      28014            107                                 日文二下
## 478      40370            107                                 日文二下
## 479      84932            107                                 日文二下
## 480      25827            107                                 日文二下
## 481      20132            107                                 日文二下
## 482      75247            107                                 日文二下
## 483      46819            107                                 日文二下
## 484      73509            107                                 日文二下
## 485      62377            107                                 日文二下
## 486      12205            107                                 日文二下
## 487      56383            107                                 日文二下
## 488      75640            107                                 日文二下
## 489      41634            107                                 日文二下
## 490      65620            107                                 日文二下
## 491      38947            107                     日本近現代文學選讀下
## 492      49765            107                               新聞日語下
## 493      49616            107                               日語口譯下
## 494      87030            107                       日本古典文學選讀下
## 495      82673            107                             日本文化史下
## 496      50671            107                                 日文三下
## 497      33858            107                                 日文三下
## 498      44382            107                                 韓文一下
## 499      46998            107                                 韓文一下
## 500      54748            107                                 韓文一下
## 501      28450            107                                 韓文一下
## 502      66037            107                                 韓文一下
## 503      78464            107                               越南文一下
## 504      40485            107                                 泰文一下
## 505      17604            107                                 泰文一下
## 506      21654            107                             菲律賓文一下
## 507      76870            107                               馬來文一下
## 508      77185            107                               印尼文一下
## 509      26971            107                                 韓文二下
## 510      71033            107                                 韓文二下
## 511      41241            107                               越南文二下
## 512      66567            107                                 泰文二下
## 513      68277            107                               馬來文二下
## 514       2001            107                                   日文下
## 515       2002            107                                   日文下
## 516       2003            107                                   日文下
## 517       2008            107                                   日文下
## 518       2005            107                                   日文下
## 519       2006            107                                   日文下
## 520       2007            107                                   日文下
## 521       2004            107                                   日文下
## 522      34101            109                       戲劇裡的性別與愛情
## 523      79095            109                               戲劇製作一
## 524      13165            109                                 劇本導讀
## 525      27726            109                                 表演一下
## 526      80577            109                                 表演一下
## 527      84944            109                                 排演一下
## 528      17105            109                                 排演一下
## 529      51532            109                               戲曲後花園
## 530      82920            109                         藝術公民行動展演
## 531      77745            109                       企業識別與品牌行銷
## 532      59729            109                                   色彩學
## 533      20435            109                             環境視覺設計
## 534      24429            109                   西洋戲劇名著選讀:現代
## 535      39198            109                   中國戲劇名著選讀:現代
## 536      17786            109                     表導演專題:寫實戲劇
## 537      41622            109                                   導演一
## 538      63952            109                               舞台設計一
## 539      16209            109                               燈光技術一
## 540      85921            109                               燈光設計一
## 541      26807            109                               服裝技術一
## 542      74084            109                               服裝技術一
## 543      61836            109                       音樂設計與製作實務
## 544      81046            109                               舞台技術二
## 545      84263            109                       西洋戲劇及劇場史下
## 546      35171            109                       中國戲劇及劇場史下
## 547      64707            109                                   排演三
## 548      49924            109                                   排演五
## 549      11330            109                                   表演三
## 550      18370            109                               戲劇製作三
## 551      43649            109                               燈光設計二
## 552      58409            109                             舞台設計專題
## 553      51282            121                                 博士論文
## 554      72893            121                                 碩士論文
## 555      25928            121                             易經專題討論
## 556      61670            121                               書志學研究
## 557      19415            121                       歐陽修古文專題研究
## 558      17260            121                               專題研究二
## 559      55076            121                               專題研究二
## 560      83491            121                               專題研究二
## 561      16337            121                               專題研究二
## 562      86590            121                               專題研究二
## 563      26048            121                               專題研究二
## 564      10397            121                               專題研究二
## 565      26576            121                               專題研究二
## 566      11743            121                    中國近現代思潮—康有為
## 567      27502            121                             現代詩學專題
## 568      75813            122                                 博士論文
## 569      57994            122                                 碩士論文
## 570      30380            122                               高級英文下
## 571      27420            122                             亞美批判論述
## 572      30547            122                         德勒茲的思想基礎
## 573      63089            122                   當代愛爾蘭戲劇中的戰爭
## 574      61525            122                     西班牙文學名著選讀二
## 575      46492            122                       法國文學名著選讀二
## 576      51861            122                       德國文學名著選讀二
## 577      77936            122                                 翻譯概論
## 578      22178            122                           西班牙流行文化
## 579      53489            122                         當代西班牙文化二
## 580      27455            123                                 博士論文
## 581      79293            123                                 碩士論文
## 582      29491            123                                 專題研究
## 583      61420            123                                 專題研究
## 584      66620            123                                 專題研究
## 585      18999            123                                 專題研究
## 586      46357            123                                 專題研究
## 587      36971            123                                 專題研究
## 588      40187            123                                 專題研究
## 589      29063            123                                 專題研究
## 590      12367            123                                 專題研究
## 591      19851            123                                 專題研究
## 592      13980            123                                 專題研究
## 593      67696            123                                 專題研究
## 594      71131            123                                 專題研究
## 595      54923            123                                 專題研究
## 596      32350            123                                 專題研究
## 597      10800            123                                 專題研究
## 598      59757            123                         研究實習與討論下
## 599      39872            123                       英文史學名著選讀下
## 600      55906            123                 台灣史史料選讀與專題討論
## 601      77904            123                       日文史學名著選讀下
## 602      62531            123                       東亞古代政治史專題
## 603      84752            123                           明清經濟史專題
## 604      33053            123                       臺灣總督府檔案選讀
## 605      66863            123                       中國思想史專題研究
## 606      38085            123                   民間文獻與地方社會研究
## 607      79927            123                             淡新檔案研究
## 608      62141            123                               文明的意義
## 609      25547            123                       中國中古社會與文化
## 610      81506            123                         清代臺灣開發史二
## 611      14888            123                           史學英文寫作二
## 612      15463            123                     日本近現代史料解析二
## 613      21736            124                                 博士論文
## 614      66966            124                       東方哲學問題討論下
## 615      39019            124                                 碩士論文
## 616      35084            124                             道家哲學研究
## 617      65001            124                             莊子哲學研究
## 618      63511            124                         中國大乘佛學研究
## 619      76534            124                         吉藏哲學專題討論
## 620      71504            124                                 真之理論
## 621      41944            124                               非古典邏輯
## 622      77295            124                   後設倫理學專題:規範性
## 623      32018            124                                 康德美學
## 624      60235            124                                 認知邏輯
## 625      81455            125                                 博士論文
## 626      23702            125                             基礎文獻評論
## 627      46341            125                                 碩士論文
## 628      20469            125                                 資料選讀
## 629      12258            125                                 資料選讀
## 630      62057            125                                 資料選讀
## 631      63255            125                                 資料選讀
## 632      63899            125                                 資料選讀
## 633      67624            125                           考古學基礎理論
## 634      12690            125                     人類學與工業社會研究
## 635      69528            125                     性別與女性主義考古學
## 636      37306            125               文化政治、現代性與台灣經驗
## 637      29021            126                                 博士論文
## 638      65410            126                                 博士論文
## 639      84565            126                                 博士論文
## 640      35644            126                                 博士論文
## 641      24719            126                                 博士論文
## 642      25624            126                                 博士論文
## 643      64666            126                                 博士論文
## 644      32610            126                                 個別研究
## 645      23002            126                                 個別研究
## 646      86931            126                                 個別研究
## 647      88799            126                                 個別研究
## 648      15845            126                                 個別研究
## 649      80345            126                                 個別研究
## 650      47040            126                                 個別研究
## 651      55288            126                                 個別研究
## 652      78787            126                               個別研究二
## 653      42743            126                               個別研究二
## 654      61661            126                               個別研究二
## 655      13081            126                               個別研究二
## 656      33344            126                 領導與圖書館管理專題研究
## 657      61609            126                         質性研究專題研討
## 658      34981            126                                 碩士論文
## 659      25594            126                                 碩士論文
## 660      73241            126                                 碩士論文
## 661      50372            126                                 碩士論文
## 662      37806            126                                 碩士論文
## 663      10461            126                                 碩士論文
## 664      24339            126                                 碩士論文
## 665      65045            126                                 碩士論文
## 666      44310            126                                 碩士論文
## 667      17747            126                                 碩士論文
## 668      87771            126                                 碩士論文
## 669      62628            126                                 碩士論文
## 670      28738            126                         中文資訊處理專題
## 671      36391            126                               專題研究一
## 672      64527            126                               專題研究一
## 673      35594            126                               專題研究一
## 674      73604            126                               專題研究一
## 675      36240            126                               專題研究一
## 676      48604            126                               專題研究一
## 677      69217            126                               專題研究一
## 678      47364            126                               專題研究一
## 679      48755            126                               專題研究一
## 680      82955            126                               專題研究一
## 681      40162            126                               專題研究一
## 682      62362            126                               專題研究二
## 683      22152            126                               專題研究二
## 684      40619            126                               專題研究二
## 685      68417            126                               專題研究二
## 686      86924            126                               專題研究二
## 687      17193            126                               專題研究二
## 688      42454            126                             資訊組織研討
## 689      51859            126                                 研究方法
## 690      83326            126                           博物館學習專題
## 691      35074            126                               索引典結構
## 692      30091            126                               圖書館建築
## 693      49523            126                                 專利資訊
## 694      63069            126                             書目療法專題
## 695      39276            126                     圖書館與資訊系統評估
## 696      32718            126                             資訊傳播專題
## 697      27383            126                         網際網路程式設計
## 698      61379            127                                 碩士論文
## 699      63946            127                       中日比較文學研究下
## 700      50701            127                       日本中世文學研究下
## 701      64302            127                     日本近現代文學研究下
## 702      80424            127                   現代日語諸問題之研究下
## 703      66813            127                     日本語言學專題研究下
## 704      34908            127                           日本語彙研究下
## 705      83911            127                         日本文化史研究下
## 706      19612            127                         日本思想史研究下
## 707      74520            127                   近代日本思想專題研究下
## 708      39043            129                                 碩士論文
## 709      73662            129                           現當代戲曲析論
## 710      87652            129                                   導演三
## 711      74373            129                                 亞美劇場
## 712      49382            129                               劇本創作二
## 713      75833            129                         莎士比亞獨白表演
## 714      23715            129                     數位虛擬電腦燈光設計
## 715      16882            129                             舞台技術專題
## 716      33759            141                   亞洲伊斯蘭教與殖民建築
## 717      18918            141                           東亞陶瓷文化史
## 718      42373            141                                 博士論文
## 719      79161            141                                 碩士論文
## 720      79719            141                           美術史學及批評
## 721      34031            141                       宋代書法史專題研究
## 722      48525            141                       工藝美術史名著導讀
## 723      87310            141                 東南亞南亞的世界文化遺產
## 724      76367            141                         佛教與印度教建築
## 725      62059            142                                 博士論文
## 726      63885            142                                 碩士論文
## 727      46532            142                             語言田野調查
## 728      42240            142                               心理語言學
## 729      21925            142                       語音學專題獨立研究
## 730      54016            142                           詞彙與知識本體
## 731      75450            142                       語法學專題獨立研究
## 732      52019            142                         認知文法專題研究
## 733      63849            142                               隱喻與認知
## 734      16552            142                           德語的語言結構
## 735      88147            144                             臺灣音樂導論
## 736      24392            144                 古琴音樂欣賞與實習【一】
## 737      86949            144                                 碩士論文
## 738      17218            144                       音樂學理論與方法二
## 739      26043            144                         西洋音樂基礎理論
## 740      33814            144                             20世紀新音樂
## 741      41631            144                             全球音樂文化
## 742      72426            144                     歐洲音樂美學經典閱讀
## 743      87610            144                         音樂、演化與大腦
## 744      47485            144                         媒體、機器、音樂
## 745      80115            145                   臺灣小說與戰後都市經驗
## 746      87919            145                                 博士論文
## 747      34186            145                                 碩士論文
## 748      77895            145                     臺灣文學史專題討論下
## 749      57393            145                 日治時期臺灣通俗小說專題
## 750      45372            145                     現代詩社群與詩人專題
## 751      23185            145                   文化社會理論與專題討論
## 752      23265            145          專題研究:文學批評與論文寫作方法
## 753      89907            145                 專題研究:文學及文化研究
## 754      55911            145                               台灣現代詩
## 755      11657            145                             從文學看臺灣
## 756      67309            145                         日本現代小說選讀
## 757      20561            145                           臺灣都市與文學
## 758      79486            146                                 碩士論文
## 759      60028            146                               漢語語法學
## 760      54179            146                               漢語音韻學
## 761      43767            146                               社會語言學
## 762      35094            146                           華人社會與文化
## 763      53469            146                          國際生華語 (二)
## 764      16490            146                          國際生華語 (二)
## 765      35488            146                          國際生華語 (二)
## 766      44943            146                          國際生華語 (二)
## 767      51015            146                          國際生華語 (二)
## 768      29170            146                          國際生華語 (二)
## 769      27688            146                          國際生華語 (二)
## 770      24864            146                          國際生華語 (二)
## 771      69108            146                          國際生華語 (二)
## 772      20385            146                          國際生華語 (二)
## 773      76437            146                          國際生華語 (二)
## 774      49189            146                          國際生華語 (二)
## 775      50266            146                          國際生華語 (二)
## 776      30683            146                          國際生華語 (二)
## 777      86961            146                          國際生華語 (二)
## 778      31115            146                          國際生華語 (二)
## 779      84413            146                          國際生華語 (二)
## 780      19983            146                          國際生華語 (二)
## 781      73172            146                          國際生華語 (二)
## 782      75508            146                      國際生實用華語 (二)
## 783      47763            146                      國際生實用華語 (二)
## 784      43544            146                      國際生實用華語 (二)
## 785      85591            146                      國際生實用華語 (二)
## 786      35209            146                      國際生實用華語 (二)
## 787      56891            146                       國際生華語探索臺灣
## 788      22118            146                           國際生商務華語
## 789      10715            147                                 碩士論文
## 790      78091            147                               口筆譯入門
## 791      65784            147                           中英對比與翻譯
## 792      29862            147                                 專題研究
## 793      27334            147                             翻譯研究方法
## 794      66515            147                                 翻譯科技
## 795      28973            147                         專業翻譯實習(二)
## 796      87821            147                         專業翻譯實習(二)
## 797      57353            147                         專業翻譯實習(三)
## 798      27284            147                             同步口譯入門
## 799      68298            147                             口譯研究方法
## 800      16093            147                         專業口譯實習(三)
## 801      49021            147                                 科技翻譯
## 802      50666            147                               文史哲翻譯
## 803      63482            147                     科技翻譯:軟體中文化
## 804       6216            201                               微積分甲下
## 805       6217            201                               微積分甲下
## 806       6210            201                               微積分甲下
## 807       6211            201                               微積分甲下
## 808       6101            201                               微積分甲下
## 809       6102            201                               微積分甲下
## 810       6103            201                               微積分甲下
## 811       6104            201                               微積分甲下
## 812       6105            201                               微積分甲下
## 813       6215            201                               微積分甲下
## 814       6106            201                               微積分甲下
## 815       6107            201                               微積分甲下
## 816       6201            201                               微積分乙下
## 817       6202            201                               微積分乙下
## 818       6203            201                               微積分乙下
## 819       6204            201                               微積分乙下
## 820       6205            201                               微積分乙下
## 821       6212            201                               微積分乙下
## 822       6213            201                               微積分乙下
## 823       6214            201                               微積分乙下
## 824       6218            201                               微積分乙下
## 825       6206            201                               微積分乙下
## 826       6207            201                               微積分乙下
## 827       6208            201                               微積分乙下
## 828       6209            201                               微積分乙下
## 829      73869            201                                   統計學
## 830      89145            201                         學士班專題研究二
## 831      71959            202                           普通物理學甲下
## 832      79337            202                           普通物理學甲下
## 833      38694            202                           普通物理學甲下
## 834      23841            202                           普通物理學甲下
## 835      69295            202                           普通物理學甲下
## 836      11148            202                           普通物理學甲下
## 837      81003            202                           普通物理學甲下
## 838      53567            202                           普通物理學甲下
## 839      68729            202                           普通物理學甲下
## 840      39197            202                           普通物理學甲下
## 841      18476            202                           普通物理學甲下
## 842      46597            202                           普通物理學甲下
## 843      38560            202                           普通物理學甲下
## 844      88194            202                           普通物理學甲下
## 845      78455            202                           普通物理學甲下
## 846      29678            202                           普通物理學甲下
## 847      37520            202                           普通物理學甲下
## 848      83549            202                           普通物理學甲下
## 849      80439            202                           普通物理學甲下
## 850      66038            202                             普通物理學乙
## 851      64765            202                             普通物理學乙
## 852      15167            202                           普通物理學乙下
## 853      44733            202                           普通物理學乙下
## 854      58564            202                           普通物理學丙下
## 855      25566            202                         普通物理學實驗下
## 856      65655            202                         普通物理學實驗下
## 857      26816            202                         普通物理學實驗下
## 858      22950            202                         普通物理學實驗下
## 859      25191            202                         普通物理學實驗下
## 860      26806            202                         普通物理學實驗下
## 861      63049            202                         普通物理學實驗下
## 862      78456            202                         普通物理學實驗下
## 863      56027            202                         普通物理學實驗下
## 864      23543            202                         普通物理學實驗下
## 865      53825            202                         普通物理學實驗下
## 866      47649            202                         普通物理學實驗下
## 867      63134            202                         普通物理學實驗下
## 868      87124            202                         普通物理學實驗下
## 869      47487            202                         普通物理學實驗下
## 870      18094            202                         普通物理學實驗下
## 871      82074            202                         普通物理學實驗下
## 872      81199            202                         普通物理學實驗下
## 873      10619            202                         普通物理學實驗下
## 874      26517            202                         普通物理學實驗下
## 875      50567            202                         普通物理學實驗下
## 876      17043            202                             從夸克到黑洞
## 877      25402            202                               應用數學一
## 878      22023            202                                   力學下
## 879      23466            202                                 電子學二
## 880      80535            202                             電子學實驗二
## 881      81614            202                               應用數學三
## 882      26231            202                               應用數學四
## 883      27161            202                               量子物理下
## 884      54090            202                           近代物理學實驗
## 885      28364            202                           近代物理學實驗
## 886      54224            202                                 光學導論
## 887      26140            202                               普通天文學
## 888      40866            203                               普通化學二
## 889      49089            203                             普通化學甲下
## 890      42036            203                             普通化學甲下
## 891      82369            203                             普通化學甲下
## 892      15649            203                               普通化學丙
## 893      33518            203                               普通化學丙
## 894      47737            203                               普通化學丙
## 895      27352            203                               普通化學丙
## 896      31209            203                             普通化學實驗
## 897      79829            203                             普通化學實驗
## 898      88933            203                             普通化學實驗
## 899      83824            203                             普通化學實驗
## 900      42996            203                             普通化學實驗
## 901      45788            203                             普通化學實驗
## 902      58005            203                             普通化學實驗
## 903      88058            203                             普通化學實驗
## 904      58975            203                             普通化學實驗
## 905      61867            203                             普通化學實驗
## 906      88952            203                           普通化學實驗下
## 907      44499            203                           普通化學實驗下
## 908      41484            203                           普通化學實驗下
## 909      67540            203                           普通化學實驗下
## 910      45630            203                           普通化學實驗下
## 911      86134            203                           普通化學實驗下
## 912      69589            203                               化學實驗二
## 913      78623            203                               化學實驗二
## 914      74015            203                             分析化學乙下
## 915      73747            203                               分析化學丁
## 916      87462            203                               分析化學二
## 917      84217            203                             分析化學實驗
## 918      84690            203                             分析化學實驗
## 919      75594            203                             分析化學實驗
## 920      86465            203                             分析化學實驗
## 921      66274            203                         分析化學實驗乙下
## 922      47832            203                         分析化學實驗乙下
## 923      51966            203                         分析化學實驗乙下
## 924      49419            203                                 有機化學
## 925      80923            203                                 有機化學
## 926      80143            203                                 有機化學
## 927      83178            203                                 有機化學
## 928      86983            203                               有機化學二
## 929      56828            203                             有機化學乙下
## 930      71226            203                             有機化學乙下
## 931      43090            203                             有機化學乙下
## 932      21398            203                               化學實驗四
## 933      69566            203                               化學實驗四
## 934      18595            203                               化學實驗四
## 935      29890            203                               化學實驗四
## 936      60920            203                             有機化學實驗
## 937      53328            203                             有機化學實驗
## 938      56732            203                             有機化學實驗
## 939      70797            203                             有機化學實驗
## 940      81428            203                             有機化學實驗
## 941      86723            203                             有機化學實驗
## 942      27563            203                             有機化學實驗
## 943      85223            203                             有機化學實驗
## 944      86176            203                             有機化學實驗
## 945      79366            203                             有機化學實驗
## 946      44260            203                             有機化學實驗
## 947      15513            203                             有機化學實驗
## 948      29367            203                         有機化學實驗乙下
## 949      55120            203                         有機化學實驗乙下
## 950      69408            203                         有機化學實驗乙下
## 951      27775            203                         有機化學實驗乙下
## 952      50580            203                         有機化學實驗乙下
## 953      27536            203                         有機化學實驗乙下
## 954      13011            203                               物理化學下
## 955      49140            203                      物理化學二-量子化學
## 956      41770            203                        物理化學三-動力學
## 957      50303            203                           物理化學實驗二
## 958      79162            203                           物理化學實驗二
## 959      38255            203                               化學實驗六
## 960      39009            203                               化學實驗六
## 961      47759            203                             從化學看世界
## 962      44664            203                               無機化學二
## 963      47548            203                                     論文
## 964      45651            203                                 書報討論
## 965      43799            203                                 書報討論
## 966      61129            203                                 書報討論
## 967      72082            203                                 書報討論
## 968      77658            203                                 書報討論
## 969      44797            203                                 書報討論
## 970      32091            203                                 書報討論
## 971      24548            203                                 書報討論
## 972      26365            203                                 書報討論
## 973      33710            203                           大四專題討論二
## 974      77493            203                           大四專題討論二
## 975      73820            203                           大四專題討論二
## 976      55900            203                           大四專題討論二
## 977      19165            203                           大四專題討論二
## 978      70109            203                           大四專題討論二
## 979      21119            203                           大四專題討論二
## 980      41883            203                           大四專題討論二
## 981      86747            203                           大四專題討論二
## 982      82088            203                           大四專題討論二
## 983      32565            203                           大四專題討論二
## 984      48180            203                           大四專題討論二
## 985      51050            203                           大四專題討論二
## 986      17546            203                           大四專題研究二
## 987      22348            203                           大四專題研究二
## 988      87383            203                           大四專題研究二
## 989      63237            203                           大四專題研究二
## 990      43790            203                           大四專題研究二
## 991      83618            203                           大四專題研究二
## 992      61089            203                           大四專題研究二
## 993      75061            203                           大四專題研究二
## 994      46208            203                           大四專題研究二
## 995      26305            203                           大四專題研究二
## 996      19940            203                           大四專題研究二
## 997      43800            204                               地質調查二
## 998      70930            204                               地質調查二
## 999      53487            204                               地質學導論
## 1000     70440            204                           地質學導論實習
## 1001     67552            204                           地質調查導論一
## 1002     37778            204                           地質調查導論一
## 1003     44712            204                           地質調查導論一
## 1004     69498            204                           地質調查導論一
## 1005     44381            204                           地質調查導論一
## 1006     86525            204                           地質調查導論二
## 1007     56488            204                           地質調查導論二
## 1008     89648            204                           地質調查導論二
## 1009     82394            204                           地質調查導論二
## 1010     25209            204                           地質調查導論二
## 1011     49152            204                           地質調查導論二
## 1012     19347            204                           地質調查導論二
## 1013     51787            204                           地質調查導論二
## 1014     66529            204                           火山災害與觀測
## 1015     63098            204                               野外地質學
## 1016     51442            204                           野外地質學實習
## 1017     25100            204                               地質調查四
## 1018     35917            204                               地質調查四
## 1019     21837            204                               地質調查四
## 1020     63232            204                               學士論文下
## 1021     52715            204                           地質科學導論下
## 1022     87049            204                                 地球歷史
## 1023     45871            204                             地球歷史實習
## 1024     45635            204                     地球物理原理(含實習)
## 1025     80533            204                           環境與工程地質
## 1026     73456            204                                 專題討論
## 1027     11506            204                           化學地質學簡介
## 1028     12787            204                               地球的奧秘
## 1029     44295            204                               專題研究二
## 1030     73418            204                               專題研究二
## 1031     13907            204                               專題研究二
## 1032     10281            204                               專題研究二
## 1033     15732            204                               專題研究二
## 1034     89038            204                               專題研究二
## 1035     89431            204                               專題研究二
## 1036     62973            204                               專題研究二
## 1037     70586            204                               專題研究二
## 1038     43079            204                               專題研究二
## 1039     49646            204                               專題研究二
## 1040     54641            204                               專題研究二
## 1041     37310            204                               專題研究二
## 1042     16963            204                               專題研究二
## 1043     47583            204                               地球氣候學
## 1044     69730            207                               普通心理學
## 1045     31617            207                               普通心理學
## 1046     54462            207                               大一研討課
## 1047     59495            207                       心理及教育統計學下
## 1048     29508            207                             心理實驗法下
## 1049     22410            207                           人類學習與認知
## 1050     23531            207                               發展心理學
## 1051     37142            207                               性格心理學
## 1052     41752            208                               普通地質學
## 1053     47588            208                     計算機概論與程式設計
## 1054     33465            208                             氣候學及實習
## 1055     33036            208                             地圖學及實習
## 1056     59966            208                         環境水文學及實習
## 1057     81381            208                                 台灣地理
## 1058     13381            208                             遙測學及實習
## 1059     76260            208                               學士論文下
## 1060     72228            208                               學士論文下
## 1061     77965            208                               學士論文下
## 1062     21535            208                               學士論文下
## 1063     87315            208                               學士論文下
## 1064     34525            208                               學士論文下
## 1065     73875            208                                 地理思想
## 1066     23455            209                         地球系統科學概論
## 1067     81058            209                                 大氣環境
## 1068     51582            209                               天氣與氣候
## 1069     21098            209                                 流體力學
## 1070     26104            209                                 數值分析
## 1071     46176            209                               應用數學二
## 1072     29074            209                             大氣動力學二
## 1073     68119            209                                 天氣學二
## 1074     65185            209                                 雲物理學
## 1075     67102            209                             物理海洋概論
## 1076     67351            209                             天氣學實習二
## 1077     33399            209                         大氣科學研究導論
## 1078     52340            209                               獨立研究二
## 1079     42635            221                                 博士論文
## 1080     57394            221                                 碩士論文
## 1081     40921            221                           偏微分方程式二
## 1082     85981            221                       數值偏微分方程式一
## 1083     86196            221                           高等統計推論二
## 1084     89490            221                                 實分析二
## 1085     74559            221                               微分幾何二
## 1086     76431            221                                 機率論二
## 1087     76581            221                               專題演講二
## 1088     49540            221                               專題演講四
## 1089     77462            221                                 泛函分析
## 1090     89388            221                                 計算金融
## 1091     42017            221                                 數值優化
## 1092     52636            221                               密碼學導論
## 1093     56470            221                                 數學建模
## 1094     67334            221                             應用數學方法
## 1095     89273            221                           多變量統計分析
## 1096     78914            222                                 博士論文
## 1097     43783            222                             高等專題研究
## 1098     19191            222                             高等專題研究
## 1099     17063            222                             高等專題研究
## 1100     53103            222                             高等專題研究
## 1101     30421            222                             高等專題研究
## 1102     65490            222                             高等專題研究
## 1103     87331            222                             高等專題研究
## 1104     47070            222                             高等專題研究
## 1105     24123            222                             高等專題研究
## 1106     16896            222                             高等專題研究
## 1107     28654            222                             高等專題研究
## 1108     28790            222                             高等專題研究
## 1109     88856            222                             高等專題研究
## 1110     26087            222                             高等專題研究
## 1111     13902            222                             高等專題研究
## 1112     80091            222                             高等專題研究
## 1113     19045            222                             高等專題研究
## 1114     78175            222                             高等專題研究
## 1115     87550            222                             高等專題研究
## 1116     45022            222                             高等專題研究
## 1117     56887            222                             高等專題研究
## 1118     56949            222                             高等專題研究
## 1119     52011            222                             高等專題研究
## 1120     40572            222                             實驗粒子物理
## 1121     49543            222                             古典電力學二
## 1122     42901            222                               量子力學三
## 1123     36298            222                               量子場論二
## 1124     34712            222                               固態理論二
## 1125     23732            222                             多體物理專題
## 1126     72746            222                       量子計算與資訊導論
## 1127     18078            222                                 電漿子學
## 1128     67672            222                 固態物理專題:進階與應用
## 1129     44140            222                 奈米元件的製程與檢測技術
## 1130     46558            222                     高等專題討論二(國際)
## 1131     88440            222                     計算材料學(國際學程)
## 1132     48015            222                     高等專題討論四(國際)
## 1133     15929            222                             奈米科技進階
## 1134     39944            222                             奈米科技進階
## 1135     27459            222               奈米尺度的量測、製作與操控
## 1136     55176            222                                 碩士論文
## 1137     10875            222                                 專題研究
## 1138     34539            222                                 專題研究
## 1139     81259            222                                 專題研究
## 1140     35195            222                                 專題研究
## 1141     24090            222                                 專題研究
## 1142     77151            222                                 專題研究
## 1143     26040            222                                 專題研究
## 1144     81941            222                                 專題研究
## 1145     71913            222                                 專題研究
## 1146     51413            222                                 專題研究
## 1147     27593            222                                 專題研究
## 1148     88918            222                                 專題研究
## 1149     88275            222                                 專題研究
## 1150     72236            222                                 專題研究
## 1151     30250            222                                 專題研究
## 1152     32253            222                                 專題研究
## 1153     31373            222                                 專題研究
## 1154     73905            222                                 專題研究
## 1155     76337            222                                 專題研究
## 1156     36563            222                                 專題研究
## 1157     88543            222                                 專題研究
## 1158     80405            222                                 專題研究
## 1159     74987            222                                 專題研究
## 1160     47620            222                                 專題研究
## 1161     57218            222                               專題討論二
## 1162     50705            222                               量子力學二
## 1163     83795            222                               量子力學二
## 1164     25396            222                             量子光學導論
## 1165     46402            222                           實驗物理專題二
## 1166     63216            222                           實驗物理專題二
## 1167     63805            222                           實驗物理專題二
## 1168     19207            222                           實驗物理專題二
## 1169     39982            222                           理論物理專題二
## 1170     80917            222                           理論物理專題二
## 1171     29485            222                           理論物理專題二
## 1172     29346            222                                   超對稱
## 1173     20220            222                   當代原子與分子物理導論
## 1174     26822            223                                 博士論文
## 1175     86778            223                                 專題研究
## 1176     10342            223                                 專題研究
## 1177     10161            223                                 專題研究
## 1178     54575            223                                 專題研究
## 1179     73711            223                                 專題研究
## 1180     75734            223                                 專題研究
## 1181     72718            223                                 專題研究
## 1182     88277            223                                 專題研究
## 1183     64609            223                                 專題研究
## 1184     51148            223                                 專題研究
## 1185     26226            223                                 專題研究
## 1186     48712            223                                 專題研究
## 1187     77527            223                                 專題研究
## 1188     56005            223                                 專題研究
## 1189     34174            223                                 專題研究
## 1190     59883            223                                 專題研究
## 1191     63759            223                                 專題研究
## 1192     68523            223                                 專題研究
## 1193     47444            223                                 專題研究
## 1194     24477            223                                 專題研究
## 1195     51233            223                                 專題研究
## 1196     58780            223                                 專題研究
## 1197     31168            223                                 專題研究
## 1198     18929            223                                 專題研究
## 1199     70017            223                                 專題研究
## 1200     33178            223                                 專題研究
## 1201     38845            223                                 專題研究
## 1202     59383            223                                 專題研究
## 1203     41478            223                                 專題研究
## 1204     55719            223                                 專題研究
## 1205     42184            223                                 專題研究
## 1206     72711            223                                 專題研究
## 1207     54204            223                                 專題研究
## 1208     36682            223                                 專題研究
## 1209     59390            223                                 專題研究
## 1210     75827            223                             當代化學研讀
## 1211     87942            223                             當代化學研讀
## 1212     21434            223                             當代化學研讀
## 1213     70598            223                             當代化學研讀
## 1214     71243            223                             當代化學研讀
## 1215     82167            223                             當代化學研讀
## 1216     67704            223                             當代化學研讀
## 1217     59360            223                             當代化學研讀
## 1218     25817            223                             當代化學研讀
## 1219     75731            223                             當代化學研讀
## 1220     79929            223                             當代化學研讀
## 1221     62423            223                             當代化學研讀
## 1222     88592            223                             當代化學研讀
## 1223     49004            223                             當代化學研讀
## 1224     15596            223                             當代化學研讀
## 1225     35920            223                             當代化學研讀
## 1226     69140            223                             當代化學研讀
## 1227     11366            223                             當代化學研讀
## 1228     41926            223                             當代化學研讀
## 1229     25425            223                             當代化學研讀
## 1230     84763            223                             當代化學研讀
## 1231     42207            223                             當代化學研讀
## 1232     18303            223                       高等分析化學專論二
## 1233     20663            223                       高等有機化學專論一
## 1234     19168            223                       高等物理化學專論二
## 1235     63851            223                       高等無機化學專論二
## 1236     25201            223                     高等化學生物學專論二
## 1237     10778            223                       專題討論(國際學程)
## 1238     15668            223                       專題研究(國際學程)
## 1239     11505            223                       專題演講(國際學程)
## 1240     85953            223                     實驗室見習(國際學程)
## 1241     80684            223                       書報討論(國際學程)
## 1242     73201            223                                 碩士論文
## 1243     45691            223                                 專題研究
## 1244     63526            223                                 專題研究
## 1245     44788            223                                 專題研究
## 1246     18829            223                                 專題研究
## 1247     50708            223                                 專題研究
## 1248     83379            223                                 專題研究
## 1249     26591            223                                 專題研究
## 1250     70316            223                                 專題研究
## 1251     86842            223                                 專題研究
## 1252     70607            223                                 專題研究
## 1253     30018            223                                 專題研究
## 1254     25604            223                                 專題研究
## 1255     63544            223                                 專題研究
## 1256     44721            223                                 專題研究
## 1257     22682            223                                 專題研究
## 1258     11232            223                                 專題研究
## 1259     32952            223                                 專題研究
## 1260     64932            223                                 專題研究
## 1261     10298            223                                 專題研究
## 1262     50122            223                                 專題研究
## 1263     48319            223                                 專題研究
## 1264     47271            223                                 專題研究
## 1265     58251            223                                 專題研究
## 1266     25103            223                                 專題研究
## 1267     43794            223                                 專題研究
## 1268     44319            223                                 專題研究
## 1269     63192            223                                 專題研究
## 1270     21914            223                                 專題研究
## 1271     81996            223                                 專題研究
## 1272     45305            223                                 專題研究
## 1273     55446            223                                 專題研究
## 1274     89221            223                                 專題研究
## 1275     50562            223                                 專題研究
## 1276     10030            223                                 專題研究
## 1277     88943            223                                 專題研究
## 1278     44914            223                                 專題研究
## 1279     57536            223                                 專題研究
## 1280     81050            223                                 專題研究
## 1281     46764            223                                 專題研究
## 1282     24820            223                                 專題研究
## 1283     43765            223                                 專題研究
## 1284     27186            223                                 專題研究
## 1285     30800            223                                 專題研究
## 1286     18405            223                                 專題研究
## 1287     47671            223                                 專題研究
## 1288     56356            223                                 專題研究
## 1289     46857            223                                 專題研究
## 1290     35411            223                                 專題研究
## 1291     20219            223                             當代化學導讀
## 1292     75417            223                             當代化學導讀
## 1293     13364            223                             當代化學導讀
## 1294     23110            223                             當代化學導讀
## 1295     48382            223                             當代化學導讀
## 1296     24298            223                             當代化學導讀
## 1297     89838            223                             當代化學導讀
## 1298     40569            223                             當代化學導讀
## 1299     54816            223                             當代化學導讀
## 1300     72623            223                             當代化學導讀
## 1301     78221            223                             當代化學導讀
## 1302     25968            223                             當代化學導讀
## 1303     77092            223                             當代化學導讀
## 1304     20285            223                             當代化學導讀
## 1305     44287            223                             當代化學導讀
## 1306     54209            223                             當代化學導讀
## 1307     43193            223                             當代化學導讀
## 1308     63814            223                             當代化學導讀
## 1309     48150            223                             當代化學導讀
## 1310     65375            223                             當代化學導讀
## 1311     53988            223                             當代化學導讀
## 1312     31343            223                             當代化學導讀
## 1313     48479            223                             當代化學導讀
## 1314     78782            223                             當代化學導讀
## 1315     32007            223                             當代化學導讀
## 1316     27255            223                             當代化學導讀
## 1317     57440            223                             當代化學導讀
## 1318     38293            223                             當代化學導讀
## 1319     71165            223                           高等分析化學二
## 1320     61304            223                           高等有機化學一
## 1321     76224            223                           高等物理化學二
## 1322     70224            223                           高等無機化學二
## 1323     81951            223                         高等化學生物學二
## 1324     55317            223                           分子動力學特論
## 1325     33842            223                         同步輻射相關研究
## 1326     75105            223                                 生物化學
## 1327     70338            223                                 材料化學
## 1328     33647            223                             分子模擬導論
## 1329     72495            223                           質譜儀及其應用
## 1330     62329            223                           藥物設計與開發
## 1331     72310            223                    高等材料化學-國際學程
## 1332     40620            224                                 博士論文
## 1333     56890            224                               專題討論二
## 1334     68400            224                         構造地質學特論二
## 1335     42248            224                             鈾釷定年特論
## 1336     84456            224                               專題討論二
## 1337     84792            224                           高等野外地質學
## 1338     27583            224                           高等野外地質學
## 1339     12170            224                               高等地層學
## 1340     64859            224                           高等地層學實驗
## 1341     10794            224                           高等構造地質學
## 1342     20620            224                 地化分析技術發展書報討論
## 1343     59811            224                             古海洋學導論
## 1344     67192            224                               地球動力學
## 1345     31059            224                               工程地質學
## 1346     62965            224                                   花粉學
## 1347     44615            224                         地質災害野外調查
## 1348     15824            224                                 時序分析
## 1349     46418            224                               地震學原理
## 1350     67892            224                                 古生物學
## 1351     63433            224                     地質微生物學書報討論
## 1352     22115            227                                 博士論文
## 1353     11642            227                                 專題討論
## 1354     43013            227                     語言心理學獨立研究五
## 1355     82881            227                       注意力控制專題研究
## 1356     30896            227                     高等臨床健康心理學三
## 1357     54061            227                                 碩士論文
## 1358     28142            227                                 專題討論
## 1359     15841            227                                 因素分析
## 1360     41263            227                         臨床心理學特論二
## 1361     14192            227                   工商心理學專題研究(一)
## 1362     74532            227                     工商心理學專題研究三
## 1363     55619            227                   社會心理學專題研究(二)
## 1364     20875            227                       高等人格社會心理學
## 1365     79856            227             科學論文寫作: 認知科學研究二
## 1366     34355            227                   高等診斷心理學及實習下
## 1367     14191            227                   高等心理治療學與實習下
## 1368     58487            227                     精神科臨床心理學實習
## 1369     25971            227                         臨床健康心理實習
## 1370     44384            227                         臨床兒童心理實習
## 1371     18071            227                       臨床神經心理實習二
## 1372     15940            227                   精神科臨床心理學實習二
## 1373     18159            227                   臨床神經心理衡鑑見習二
## 1374     64324            227                       心理計量專題研究五
## 1375     87956            227                             學術寫作專題
## 1376     86233            227                     行為神經科學研究方法
## 1377     75281            227                           跨感官消息處理
## 1378     72047            227                               閱讀心理學
## 1379     80413            227                         犯罪、毒品與人性
## 1380     45056            227                       臨床神經心理學概論
## 1381     32465            227                   知覺與注意力專題研究二
## 1382     83545            227                   注意力與記憶專題討論二
## 1383     29734            227                   感覺神經科學專題討論二
## 1384     40357            227                           視覺專題研究六
## 1385     34108            228                                 博士論文
## 1386     81706            228                               專題討論一
## 1387     30534            228                               專題討論二
## 1388     24405            228                               專題討論三
## 1389     77162            228                               專題討論四
## 1390     63152            228                                 碩士論文
## 1391     61932            228                               專題討論二
## 1392     17075            228                                 地理思想
## 1393     51039            228                   都市與區域發展決策分析
## 1394     23502            228                       應用計量地理學專論
## 1395     52150            228                         地理資訊系統專論
## 1396     87660            228                             經濟地理特論
## 1397     60746            228                 中國大陸發展的政治經濟學
## 1398     25543            228                         水文地形作用模擬
## 1399     71026            228                             空間資訊專論
## 1400     31122            228                                 環境毒理
## 1401     57259            228                 公眾參與地理資訊系統概論
## 1402     13289            228                               運輸地理學
## 1403     47873            228                             遙測國土監測
## 1404     67106            228                       環境變遷中生態議題
## 1405     39092            229                                 博士論文
## 1406     27257            229                                 專題討論
## 1407     48835            229                                 專題討論
## 1408     95003            229                       大尺度雲與水汽過程
## 1409     19987            229                                 碩士論文
## 1410     75885            229                                 專題討論
## 1411     46044            229                                 專題討論
## 1412     21910            229                                 專題討論
## 1413     14960            229                                 專題討論
## 1414     71988            229                                 專題討論
## 1415     88047            229                             熱帶氣象專題
## 1416     13343            229                           天氣診斷專題一
## 1417     27341            229                               能源與環境
## 1418     38173            229                               生物氣象學
## 1419     95019            229                                 數學建模
## 1420     40593            229                         生地化循環與氣候
## 1421     81150            229                             雲霧觀測實作
## 1422     39550            241                                 博士論文
## 1423     45138            241                                 專題討論
## 1424     41110            241                                 專題討論
## 1425     37775            241                                 書報討論
## 1426     26509            241                                 碩士論文
## 1427     26308            241                               專題討論一
## 1428     58597            241                               專題討論二
## 1429     33827            241                             專題討論三下
## 1430     17459            241                                 書報討論
## 1431     52100            241                             專題討論四下
## 1432     14744            241                           理論物理海洋上
## 1433     36179            241                         海洋二氧化碳系統
## 1434     81915            241                             理論海洋化學
## 1435     42714            241                           海洋微生物學二
## 1436     23573            241                         海洋細菌研究法二
## 1437     43067            241                         側掃聲納應用概論
## 1438     18360            241                             地質海上實習
## 1439     78088            241                           化學組書報討論
## 1440     70351            241                             化學海上實習
## 1441     78032            241                         地質組書報討論下
## 1442     20990            241                         震測資料處理實務
## 1443     72257            241                         河口微量元素化學
## 1444     39951            241                           珊瑚生物學選讀
## 1445     18008            241                           環境放射化學二
## 1446     76184            241                               海洋沈積學
## 1447     14127            241                       穩定同位素地球化學
## 1448     56715            241                   天然氣水合物專題討論二
## 1449     15849            241                   魚類生理生態專題研究一
## 1450     56884            241                       海洋無脊椎動物專題
## 1451     83897            241                       生態模擬專題討論二
## 1452     82006            241                               觀測地震學
## 1453     16106            241                             海洋地質概論
## 1454     52204            241                             海洋科學概論
## 1455     40928            241                             海洋科學概論
## 1456     44856            241                             海洋化學概論
## 1457     60636            241                             物理海洋概論
## 1458     85552            241                             海洋生物概論
## 1459     52259            241                               物理海洋學
## 1460     67914            241                           海洋量測與實習
## 1461     70784            241                         魚類硬組織定齡學
## 1462     60544            241                             海洋環境化學
## 1463     12633            241                 統計生態學與程式語言應用
## 1464     20014            241                             基礎海洋統計
## 1465     29238            241                           海洋保育生物學
## 1466     89980            241                    生態模擬:以C語言為例
## 1467     83259            241                             生物系統模擬
## 1468     21883            241                       理論演化生態學導論
## 1469     10386            244                                 博士論文
## 1470     57304            244                             高等專題研究
## 1471     31128            244                             高等專題研究
## 1472     51611            244                             高等專題研究
## 1473     20063            244                           高等專題討論二
## 1474     17795            244                           粒子天文物理學
## 1475     42617            244                               廣義相對論
## 1476     70970            244                                 碩士論文
## 1477     70074            244                                 專題研究
## 1478     50456            244                               專題討論二
## 1479     89370            244                             星系天文物理
## 1480     43627            245                                 博士論文
## 1481     35162            245                   高等應用物理專題討論二
## 1482     85027            245                                 碩士論文
## 1483     81325            245                       應用物理專題討論二
## 1484     77731            245                           自旋電子學導論
## 1485     15313            302                                 政治學二
## 1486     59255            302                                 政治學二
## 1487     38101            302                                 政治學二
## 1488     15132            302                               國際關係二
## 1489     36994            302                               國際關係二
## 1490     23421            302                               國際關係二
## 1491     17275            302                                 行政學二
## 1492     83714            302                                 行政學二
## 1493     50047            302                         政治發展與民主化
## 1494     49552            302                             行政資訊管理
## 1495     12725            302                     中華民國憲法及政府二
## 1496     33111            302                     中華民國憲法及政府二
## 1497     50423            302                     中華民國憲法及政府二
## 1498     45846            302                               比較政府二
## 1499     86127            302                               比較政府二
## 1500     39604            302                               比較政府二
## 1501     48178            302                               經濟學乙二
## 1502     31451            302                             中國政治史二
## 1503     65274            302                             應用統計學二
## 1504     83127            302                             應用統計學二
## 1505     87412            302                             應用統計學二
## 1506     50042            302                           西洋政治哲學二
## 1507     13652            302                         社會科學研究方法
## 1508     40820            302                         社會科學研究方法
## 1509     39955            302                               政治社會學
## 1510     18763            302                         公共人力資源管理
## 1511     48913            302                           中國政治哲學二
## 1512     13984            302                           中國政治哲學二
## 1513     31689            302                         公共財務管理議題
## 1514     87348            302                           比較政治理論二
## 1515     43860            302                     台灣地區政治經濟發展
## 1516     14363            302                           現代政治思想二
## 1517     58809            302                               國際公法二
## 1518     74548            302                           外交決策與政策
## 1519     68919            302                             國際關係史二
## 1520     75192            302                               公共政策二
## 1521     39422            302                                 外交實務
## 1522     20212            302                         中國政治制度史二
## 1523     20865            302                           國際政治理論二
## 1524     74988            302                                 國際安全
## 1525     71678            302                                 行政法二
## 1526     20994            302                       經貿暨區域國際組織
## 1527     37633            302                           國際政治經濟學
## 1528     75445            302                     中國大陸政治經濟發展
## 1529     17334            302                                 政治概論
## 1530     15823            302                                 非洲政治
## 1531     70250            303                       經濟學原理與實習下
## 1532     47991            303                       經濟學原理與實習下
## 1533     77325            303                       經濟學原理與實習下
## 1534     31436            303                       經濟學原理與實習下
## 1535     39199            303                       經濟學原理與實習下
## 1536     19928            303                               民法概要乙
## 1537     23415            303                                 經濟史二
## 1538     84380            303                             個體經濟學二
## 1539     59372            303                             個體經濟學二
## 1540     40451            303                             個體經濟學二
## 1541     54710            303                             個體經濟學二
## 1542     43416            303                             個體經濟學二
## 1543     45963            303                             總體經濟學二
## 1544     40186            303                             總體經濟學二
## 1545     84428            303                             總體經濟學二
## 1546     73778            303                             總體經濟學二
## 1547     88455            303                                 經濟學一
## 1548     34249            303                                 經濟學二
## 1549     43364            303                                 經濟學二
## 1550     77232            303                                 公司理財
## 1551     55346            303                             當代中國經濟
## 1552     89070            303                             經濟思想史二
## 1553     60283            303                               財政學專題
## 1554     14862            303                               財政學專題
## 1555     55334            303                             貨幣銀行學二
## 1556     81565            303                             貨幣銀行學二
## 1557     66450            303                               學士論文下
## 1558     28156            303                         創新和產業經濟學
## 1559     71201            303                                 貿易理論
## 1560     64328            303                                 貿易政策
## 1561     46480            303                                 貿易政策
## 1562     82246            303                                 國際金融
## 1563     31049            303                             計量經濟學二
## 1564     78140            303                         日文經濟學選讀二
## 1565     66770            303                         經濟學的政策運用
## 1566     16302            305                               社會學甲下
## 1567     34049            305                                 社會學丁
## 1568     39416            305                                 社會學丁
## 1569     78981            305                               社會學導論
## 1570     43626            305                               社會統計下
## 1571     79757            305                               設計與社會
## 1572     80583            305                             反身性社會學
## 1573     44977            305                               宗教社會學
## 1574     25852            305                       大眾文化與東亞社會
## 1575     69526            305                         社會研究方法甲下
## 1576     31335            305                                 社會組織
## 1577     66501            305                             經濟社會學二
## 1578     12317            305                             社會學理論下
## 1579     73257            305                               影像社會學
## 1580     17782            305                               管理社會學
## 1581     70276            305                               音樂社會學
## 1582     66582            305                               災難與社會
## 1583     82375            310                           社會工作概論下
## 1584     20104            310                               社會心理學
## 1585     81262            310                             家庭社會工作
## 1586     65216            310                           方案設計與評估
## 1587     63887            310                                 社會統計
## 1588     60056            310                             社會福利概論
## 1589     55337            310                                 社會保險
## 1590     69189            310                       社會工作研究方法下
## 1591     28617            310                             社會福利行政
## 1592     25600            310                             老人福利服務
## 1593     95020            310                             臨床社工實務
## 1594     46871            310                       兒童虐待問題與研究
## 1595     65268            310                         早期療育社會工作
## 1596     68062            310                       人類行為與社會環境
## 1597     13648            322                                 博士論文
## 1598     22301            322                         公共政策專題研究
## 1599     10061            322                         比較政治專題研究
## 1600     10380            322                         國際關係專題研究
## 1601     50438            322                         地方治理專題研究
## 1602     77480            322                 日本近現代外交史專題研究
## 1603     40849            322                                 碩士論文
## 1604     28840            322                         中共外交政策專題
## 1605     29805            322                             公共政策專題
## 1606     18068            322                             公共政策專題
## 1607     23373            322                                 公法專題
## 1608     50964            322                     社會科學統計方法專題
## 1609     95021            322                             兩岸關係專題
## 1610     50913            322                         西洋政治思想專題
## 1611     64583            322                         外交決策分析專題
## 1612     64522            322                               國際法專題
## 1613     16362            322                           研究與寫作專題
## 1614     77374            322                           政治經濟學專題
## 1615     61590            322                         比較政治理論專題
## 1616     11403            322                   人力資源管理與發展專題
## 1617     51410            322                   中國大陸政治與經濟專題
## 1618     46996            322                       環境政治與政策專題
## 1619     38495            322                           研究與寫作專題
## 1620     18919            322                           研究與寫作專題
## 1621     40750            322                         行政管理方法專題
## 1622     17256            322                         臺灣社經發展專題
## 1623     95022            322                       立法運作與遊說專題
## 1624     61228            322             中國學的知識社群個案比較專題
## 1625     77055            322                     台灣地方政治生態專題
## 1626     48421            322                       歐盟與國際政治專題
## 1627     48308            322                   國際關係社會建構論專題
## 1628     31722            322               防擴散國際安全與國際法專題
## 1629     36129            322                           東北亞安全專題
## 1630     75140            322                     法文經典文獻選讀專題
## 1631     30777            322                   言論自由與憲法解釋專題
## 1632     40542            322                 新聞、傳播政策與法律專題
## 1633     87354            322                                 東亞專題
## 1634     69174            322       社會主義國家政治變遷與半總統制專題
## 1635     13862            323                                 博士論文
## 1636     32141            323                                 碩士論文
## 1637     55853            323                                 專題討論
## 1638     27065            323                        專題討論─經濟史二
## 1639     85701            323                    專題討論─貨幣與總體二
## 1640     77809            323                           個體經濟理論二
## 1641     69302            323                           總體經濟理論二
## 1642     65305            323                         貨幣理論與政策一
## 1643     46671            323                         貨幣理論與政策二
## 1644     41534            323                                 經濟發展
## 1645     25044            323                       國際金融理論與實證
## 1646     87267            323                             區域經濟學二
## 1647     83694            323                         進階總體理論專題
## 1648     14667            323                         貿易與產業專題三
## 1649     11820            323                           經濟學研究方法
## 1650     33581            323                         經濟實證與預測二
## 1651     73635            323                               價格分析二
## 1652     42462            323                         所得與就業理論二
## 1653     70011            323                             公共政策專題
## 1654     80005            323                       產業經濟與政策分析
## 1655     55414            323                                 財務管理
## 1656     38370            323                             中國經濟研究
## 1657     86808            323                     市場與台灣經濟發展二
## 1658     72006            323                       產業組織與廠商策略
## 1659     51892            323                       經濟學學術英文寫作
## 1660     75740            323                             時間序列分析
## 1661     52242            323                           高等統計推論二
## 1662     37790            323                               財務經濟學
## 1663     55968            323                               歐洲經濟一
## 1664     12333            323                           神經經濟學專題
## 1665     11034            325                                 博士論文
## 1666     40267            325                                 碩士論文
## 1667     13223            325                           文化社會學專題
## 1668     19659            325                             論文研究寫作
## 1669     18543            325                       組織社會學專題討論
## 1670     61513            325                           當代社會學理論
## 1671     20918            325                       醫療社會學專題討論
## 1672     58019            325                           師生研究討論二
## 1673     39323            325                       階級社會學專題討論
## 1674     61909            325                           社會學研究方法
## 1675     23012            325                 社會經濟組織的創新與設計
## 1676     85213            330                                 博士論文
## 1677     30430            330                                 碩士論文
## 1678     59744            330                               實地工作一
## 1679     76272            330                               實地工作一
## 1680     31611            330                           社會工作研究法
## 1681     72549            330                           婦女與社會政策
## 1682     52561            330                     老人社會工作專題討論
## 1683     59597            330                         進階團體工作實務
## 1684     87769            330                                 兒童福利
## 1685     47780            330                           家庭健康與疾病
## 1686     50395            330                             社會工作管理
## 1687     68674            341                           國家與社會發展
## 1688     52810            341                               富裕與貧窮
## 1689     78814            341                           國會與憲政民主
## 1690     37383            341                                   議事學
## 1691     45797            341                         中共的政經社發展
## 1692     44651            341                             海洋政策通論
## 1693     31320            341                             本國憲法通論
## 1694     66408            341                     科技與社會:工程文化
## 1695     20763            341                           西方人文學導論
## 1696     54728            341                                 博士論文
## 1697     89134            341                   社會科學方法論專題研究
## 1698     26370            341                         進階統計分析專題
## 1699     68167            341                   東亞儒學原典與論著選讀
## 1700     78907            341               全球衛生風險的法律治理專題
## 1701     52791            341               比較政治與中國大陸研究專題
## 1702     39671            341                                 碩士論文
## 1703     52899            341                           社會科學研究法
## 1704     63382            341                               全球化專題
## 1705     61091            341                               專題研究一
## 1706     72278            341                               專題研究一
## 1707     36626            341                   國家發展理論與政策專題
## 1708     17525            341                         社會科學研究方法
## 1709     22392            341                           文化與文明專題
## 1710     39613            341                       公法與憲政發展專題
## 1711     55545            341                       社會安全與政策專題
## 1712     88071            341                             大陸政策專題
## 1713     25761            341                           政府與企業專題
## 1714     49785            341               政府決策與府會關係實務研究
## 1715     60121            341                   憲法解釋與法治發展專題
## 1716     81226            341                       法國憲法與政治專題
## 1717     75732            341                       憲法與政治發展專題
## 1718     48103            341                     中共海洋政策專題研究
## 1719     12572            341                 台灣政經發展空間分析專題
## 1720     30693            341                       法律的政治分析專題
## 1721     73866            341                   中國經濟發展與改革專題
## 1722     61154            341                         中國大陸專題研究
## 1723     84753            341                         歐盟社會政策專題
## 1724     22856            341                             美國政府專題
## 1725     89288            341                   氣候變遷與永續發展專題
## 1726     66061            341                     資訊法與資訊政策專題
## 1727     53881            341                   台灣族群與國家認同專題
## 1728     79836            341               區域經濟整合與勞動政策專題
## 1729     66558            341                     全球化與社會發展專題
## 1730     84915            341                             量化分析專題
## 1731     35981            341                       東亞朱子學專題研究
## 1732     35273            341               鄧小平後的大陸政經改革專題
## 1733     79141            342                                 碩士論文
## 1734     60274            342                             傳播研究方法
## 1735     57024            342                             傳播研究方法
## 1736     36683            342                       碩士論文寫作專題A
## 1737     21214            342                       碩士論文寫作專題B
## 1738     82501            342                             英文新聞寫作
## 1739     25480            342                     多元文化論與傳播研究
## 1740     64027            342                                 環境傳播
## 1741     13366            342                             雜誌企劃實務
## 1742     35578            342                   國際政治與兩岸關係專題
## 1743     10139            342                               多媒體創作
## 1744     18651            342                               採訪寫作二
## 1745     10329            342                               採訪寫作二
## 1746     37117            342                               影像報導二
## 1747     62140            342                 科學在文化中的定位和挑戰
## 1748     85936            401                               寄生蟲學乙
## 1749     52155            401                           寄生蟲學實驗乙
## 1750     47181            401                               生理學甲下
## 1751     25807            401                                 藥理學丙
## 1752     59026            401                             藥理學實驗丙
## 1753     46354            401                               小組討論二
## 1754     54654            401                               應用病理學
## 1755     64725            401                           應用病理學實驗
## 1756     35275            401                   人文與醫學體驗學習(二)
## 1757     33092            401                   人文與醫學體驗學習(四)
## 1758     15685            401                       大體解剖學及實驗下
## 1759     53515            401                                 組織學下
## 1760     25004            401                               環境與健康
## 1761     83483            401                       衛生政策與健康保險
## 1762     29728            401                                 胚胎學下
## 1763     42605            401                             生物化學實驗
## 1764     39040            401                               生物化學下
## 1765     52686            401                               醫學心理學
## 1766     35881            401                               醫學心理學
## 1767     68970            401                               神經解剖學
## 1768     45529            401                               神經科學乙
## 1769     64393            401                       微生物學及免疫學丙
## 1770     64650            401                           微生物學實驗乙
## 1771     48255            401                     微生物學及免疫學實驗
## 1772     68941            401                     微生物學免疫學及實驗
## 1773     65047            401                         微生物學及免疫學
## 1774     14541            401                               寄生蟲學甲
## 1775     15065            401                               寄生蟲學丙
## 1776     57535            401                     人與科技體驗學習(二)
## 1777     50373            401                         病理學甲及實驗下
## 1778     24213            401                         病理學乙及實驗下
## 1779     36143            401                     病理、藥理小組討論下
## 1780     36552            401                           臨床醫學總論二
## 1781     56747            401                         臨床醫學總論三下
## 1782     50700            401                             醫學遺傳學一
## 1783     48593            401                                 藥理學下
## 1784     70846            401                               藥理學實驗
## 1785     12010            401                         老年醫學臨床概論
## 1786     51380            401                       門診醫學及急診醫學
## 1787     11043            401                         家庭、社會與醫療
## 1788     82884            401                                   內科學
## 1789     25472            401                                   外科學
## 1790     23642            401                               臨床藥理學
## 1791     19637            401                         臨床病理討論一下
## 1792     64537            401                               醫用營養學
## 1793     48620            401                                 急診醫學
## 1794     86253            401                                 小兒科學
## 1795     85828            401                               醫學士論文
## 1796     25678            401                           內科學及實習甲
## 1797     20193            401                           內科學及實習甲
## 1798     88331            401                           內科學及實習乙
## 1799     39049            401                           外科學及實習甲
## 1800     84676            401                           外科學及實習甲
## 1801     30974            401                           外科學及實習乙
## 1802     28324            401                             麻醉學及實習
## 1803     70813            401                             麻醉學及實習
## 1804     39634            401                                   神經學
## 1805     29630            401                         耳鼻喉科學及實習
## 1806     59465            401                         耳鼻喉科學及實習
## 1807     61744            401                             眼科學及實習
## 1808     58639            401                             眼科學及實習
## 1809     84485            401                           皮膚科學及實習
## 1810     43553            401                           皮膚科學及實習
## 1811     87463            401                       環境及職業醫學實習
## 1812     70473            401                       環境及職業醫學實習
## 1813     85810            401                           家庭醫學及實習
## 1814     14939            401                           家庭醫學及實習
## 1815     23894            401                                 精神醫學
## 1816     18402            401                           臨床倫理與法律
## 1817     46138            401                           腫瘤醫學及實習
## 1818     65330            401                   檢驗醫學、病理學及實習
## 1819     46250            401                             骨科學及實習
## 1820     37525            401                             骨科學及實習
## 1821     24459            401                           放射線學及實習
## 1822     28054            401                           放射線學及實習
## 1823     29879            401                                 復健醫學
## 1824     46292            401                           泌尿科學及實習
## 1825     51845            401                           泌尿科學及實習
## 1826     45291            401                           急診醫學及實習
## 1827     46549            401                           急診醫學及實習
## 1828     44037            401                                 婦產科學
## 1829     45370            401                           進階醫學研究甲
## 1830     58570            401                           進階醫學研究甲
## 1831     81302            401                           進階醫學研究乙
## 1832     79693            401                             內科臨床實習
## 1833     69031            401                             外科臨床實習
## 1834     60610            401                         麻醉科臨床實習丙
## 1835     31581            401                         精神科臨床實習丙
## 1836     72281            401                         神經科臨床實習丙
## 1837     13311            401                         婦產科臨床實習乙
## 1838     44890            401                       急診醫學臨床實習丙
## 1839     69840            401                       腫瘤醫學臨床實習丙
## 1840     71045            401                         皮膚科臨床實習丙
## 1841     33285            401                           眼科臨床實習丙
## 1842     66138            401                       耳鼻喉科臨床實習丙
## 1843     67899            401                       家庭醫學臨床實習丙
## 1844     65555            401                         小兒科臨床實習乙
## 1845     28625            401                         泌尿科臨床實習丙
## 1846     60907            401                       放射線科臨床實習丙
## 1847     86993            401                       復健醫學臨床實習丙
## 1848     74495            401                           骨科臨床實習丙
## 1849     41571            401                             血管新生導論
## 1850     39007            402                             口腔醫學導論
## 1851     49855            402                         牙體復形學實驗一
## 1852     43908            402                               口腔解剖學
## 1853     61582            402                       解剖及生理小組討論
## 1854     88413            402                             牙科器材學一
## 1855     44705            402                               牙科藥理學
## 1856     62039            402                             牙科放射線學
## 1857     18249            402                               口腔病理學
## 1858     37326            402                           口腔病理學實驗
## 1859     66010            402                             牙體復形學一
## 1860     64773            402                                 牙髓病學
## 1861     68801            402                                 牙周病學
## 1862     67038            402                             牙周病學實驗
## 1863     32394            402                             牙髓病學實驗
## 1864     40234            402                           牙科公共衛生學
## 1865     26331            402                                   咬合學
## 1866     25013            402                               固定補綴學
## 1867     47543            402                           固定補綴學實驗
## 1868     55324            402                         口腔顎面外科學二
## 1869     28983            402                               牙科矯正學
## 1870     14564            402                           牙科矯正學實驗
## 1871     51146            402                               口腔植體學
## 1872     63916            402                   初階牙體復形學臨床實習
## 1873     14752            402                       初階補綴學臨床實習
## 1874     37032            402                     初階牙周病學臨床實習
## 1875     15367            402               初階口腔顎面外科學臨床實習
## 1876     27056            402                     初階牙髓病學臨床實習
## 1877     64142            402                     臨床實習前訓練課程下
## 1878     65429            402                     口腔診斷學臨床實習下
## 1879     41887            402                     牙科放射線臨床實習下
## 1880     78478            402                       牙體復形學臨床實習
## 1881     85652            402                         牙髓病學臨床實習
## 1882     86338            402                         牙周病學臨床實習
## 1883     46814            402                       固定補綴學臨床實習
## 1884     41712            402                       局部補綴學臨床實習
## 1885     89876            402                       全口補綴學臨床實習
## 1886     36037            402                     口腔顎面外科臨床實習
## 1887     68025            402                       牙科矯正學臨床實習
## 1888     51392            402                         兒童牙科臨床實習
## 1889     67533            402                       牙科臨床病例討論下
## 1890     81448            403                                 藥劑學一
## 1891     14614            403                             藥劑學實驗一
## 1892     66250            403                               生物化學一
## 1893     16035            403                                   本草學
## 1894     15770            403                                 藥理學二
## 1895     12866            403                               藥理學實驗
## 1896     65792            403                               藥物化學下
## 1897     79777            403                   生物藥劑學暨藥物動態學
## 1898     84038            403                             社區藥局概論
## 1899     71324            403                                 非處方藥
## 1900     54685            403                                 製藥技術
## 1901     78908            403                               藥學實習一
## 1902     32549            403                               藥學實習二
## 1903     77575            403                               藥學實習三
## 1904     54714            403                               藥學實習四
## 1905     82897            403                               藥學實習五
## 1906     72948            403                               藥學實習六
## 1907     52393            403                               藥學實習七
## 1908     34998            403                               藥學實習八
## 1909     45105            403                               藥學實習九
## 1910     53494            403                               藥學實習十
## 1911     62853            403                                 藥學實習
## 1912     78553            404                                 醫技導論
## 1913     64581            404                               專題研究一
## 1914     23247            404                               專題研究二
## 1915     49461            404                               專題研究三
## 1916     66997            404                               專題研究四
## 1917     73597            404                               臨床鏡檢學
## 1918     47163            404                           臨床鏡檢學實驗
## 1919     42071            404                     血液學與臨床血液學下
## 1920     83492            404                             血液學實驗下
## 1921     44819            404                   組織及病理切片技術實驗
## 1922     63461            404                         醫學檢驗小班教學
## 1923     84351            404                         臨床細菌及黴菌學
## 1924     87092            404                     臨床細菌及黴菌學實驗
## 1925     30612            404                       細菌生物技術學實驗
## 1926     74546            404                           臨床血清免疫學
## 1927     31687            404                                   血庫學
## 1928     31086            404                               臨床病毒學
## 1929     46768            405                                 衛生保健
## 1930     35069            405                               藝術概論二
## 1931     56659            405                               醫學與生活
## 1932     10113            405                               醫學與生活
## 1933     45536            405                             一般醫學保健
## 1934     37293            405                             民眾基本救護
## 1935     70314            405                               醫學與人文
## 1936     51357            406                               基本護理學
## 1937     18940            406                           基本護理學實習
## 1938     44262            406                             生物化學概論
## 1939     29252            406                           內外科護理學二
## 1940     77184            406                       內外科護理學實習二
## 1941     56439            406                               產科護理學
## 1942     12886            406                           產科護理學實習
## 1943     44278            406                               兒科護理學
## 1944     72970            406                           兒科護理學實習
## 1945     48584            406                         護理專業問題研討
## 1946     58139            406                             護理行政概論
## 1947     44374            406                         護理行政概論實習
## 1948     52023            406                     綜合臨床護理學實習二
## 1949     32947            406                           社區衛生護理學
## 1950     78311            406                       社區衛生護理學實習
## 1951     82329            406                           精神衛生護理學
## 1952     85959            406                       精神衛生護理學實習
## 1953     87087            408                           基礎物理治療學
## 1954     89439            408                       基礎物理治療學實習
## 1955     30868            408                               應用生理學
## 1956     71511            408                                 生物力學
## 1957     71301            408                   物理治療與健康照護倫理
## 1958     60705            408                               操作治療學
## 1959     45338            408                           操作治療學實習
## 1960     18678            408                               表體解剖學
## 1961     12574            408                         物理因子治療學一
## 1962     78349            408                     物理因子治療學實習一
## 1963     89435            408                         物理因子治療學二
## 1964     42823            408                     物理因子治療學實習二
## 1965     88213            408                                 臨床見習
## 1966     40565            408                       物理治療行政管理學
## 1967     35552            408                                   復健學
## 1968     69442            408                       物理治療臨床實習二
## 1969     81441            408                               科技輔具學
## 1970     71681            408                           科技輔具學實習
## 1971     82702            408                         問題導向物理治療
## 1972     57992            408                         問題導向物理治療
## 1973     68979            408                   小兒物理治療學及實習二
## 1974     18306            408                   骨科物理治療學及實習二
## 1975     61550            408                   神經物理治療學及實習二
## 1976     88214            408                 呼吸循環物理治療及實習二
## 1977     59972            408                       物理治療臨床實習三
## 1978     76233            408                       物理治療臨床實習四
## 1979     25620            408                       物理治療臨床實習五
## 1980     44099            408                       物理治療臨床實習六
## 1981     76618            408                       物理治療臨床實習七
## 1982     46301            408                       物理治療臨床實習八
## 1983     37934            408                      物理治療臨床實習(A)
## 1984     20754            408                         物理治療專題討論
## 1985     46407            408                             物理治療研究
## 1986     44640            409                               醫學倫理學
## 1987     47829            409                               人類發展學
## 1988     19292            409                           人類發展學實習
## 1989     87917            409                         職能治療臨床見習
## 1990     45362            409                         心理疾病職能治療
## 1991     29215            409                     心理疾病職能治療實習
## 1992     62154            409                           職能治療管理學
## 1993     86222            409                     就學與就業之職能治療
## 1994     61355            409                 就學與就業之職能治療實習
## 1995     76951            409                         人體動作分析概論
## 1996     47629            409                             手傷職能治療
## 1997     34704            409                     日常生活功能評估訓練
## 1998     11155            409                 日常生活功能評估訓練實習
## 1999     32377            409                         副木、裝具義肢學
## 2000     80698            409                     副木、裝具義肢學實習
## 2001     75825            409                     職能治療科學文獻導讀
## 2002     35953            409                         職能治療專題討論
## 2003     13340            409                       職能治療臨床實習三
## 2004     74730            409                       職能治療臨床實習四
## 2005     59910            409                       職能治療臨床實習五
## 2006     64570            409                       職能治療臨床實習六
## 2007     56284            409                       職能治療臨床實習七
## 2008     72554            409                       職能治療臨床實習八
## 2009     59567            409                       社區職能治療與實習
## 2010     48598            420                     蛋白質體學之醫藥應用
## 2011     14624            420                               細胞生物學
## 2012     28038            420                               超音波醫學
## 2013     34028            420                             生物資訊導論
## 2014     24084            420                             神經科學導論
## 2015     15195            420                       醫學研究專題討論二
## 2016     54505            420                           訊息傳遞與疾病
## 2017     10548            420                       轉譯醫學及臨床試驗
## 2018     59673            421                                 博士論文
## 2019     18241            421                                 論文研究
## 2020     65674            421                         醫學新知專題討論
## 2021     54000            421                                 書報討論
## 2022     54028            421                       臨床試驗實務實習二
## 2023     20800            421                                 碩士論文
## 2024     62926            421                         臨床研究方法(二)
## 2025     70759            421                           骨科臨床實習二
## 2026     37528            421                         小兒科臨床實習二
## 2027     47772            421                         婦產科臨床實習二
## 2028     82258            421                           內科臨床實習二
## 2029     42836            421                       影像醫學臨床實習二
## 2030     60089            421                           眼科臨床實習二
## 2031     28954            421                         泌尿科臨床實習二
## 2032     87100            421                           外科臨床實習二
## 2033     76796            421                         急診科臨床實習二
## 2034     40745            421                         神經科臨床實習二
## 2035     87382            421                     耳鼻喉科學臨床實習二
## 2036     68972            421                       皮膚科學臨床實習二
## 2037     34814            421                   基礎與臨床醫學整合課程
## 2038     86919            421                                 實驗研究
## 2039     77849            421                         醫用磁振造影技術
## 2040     11720            421                   疾病概論:未解決的問題
## 2041     88777            421                             血管新生導論
## 2042     78169            421                             臨床試驗概論
## 2043     25826            422                                 博士論文
## 2044     59187            422                                 專題討論
## 2045     54272            422                         高級臨床牙醫學二
## 2046     44025            422                         高級臨床牙醫學四
## 2047     12618            422                       口腔外科病理討論二
## 2048     26945            422                         口腔生物學特論二
## 2049     33923            422                               酸蝕技術學
## 2050     51547            422                                 碩士論文
## 2051     64293            422                           研究論文討論下
## 2052     50338            422                       兒童牙科學專題討論
## 2053     73543            422               牙周補綴矯正之聯合治療  二
## 2054     59562            422               牙周補綴矯正之聯合治療  四
## 2055     26395            422                       研究計劃專題討論下
## 2056     86361            422                         口顏肌神經生理學
## 2057     82362            422                       矯正治療成果討論二
## 2058     26869            422                       矯正治療成果討論四
## 2059     72861            422                     齒顎矯正診斷治療學二
## 2060     68178            422                         醫院兒童牙科學二
## 2061     66422            422                     兒童牙科學臨床實習四
## 2062     63226            422                     兒童牙科學臨床實習二
## 2063     33871            422                     兒童牙科診斷治療學二
## 2064     30884            422                     兒童牙科診斷治療學四
## 2065     58630            422                           兒童發育生長學
## 2066     56602            422                     齒顎矯正學臨床實習二
## 2067     81096            422                     齒顎矯正學臨床實習四
## 2068     40065            422                 高級齒顎矯正學臨床實習二
## 2069     85639            422                     齒顎矯正診斷治療學四
## 2070     63167            422                     齒顎矯正學專題討論二
## 2071     40217            422                     齒顎矯正學專題討論四
## 2072     31653            422                           顱顏成長發育學
## 2073     17663            422                       口腔外科臨床實習二
## 2074     39118            422                       口腔外科臨床實習四
## 2075     37709            422                       口腔外科病例討論二
## 2076     12924            422                       口腔外科病例討論四
## 2077     19805            422                       口腔外科專題討論二
## 2078     57729            422                       口腔外科專題討論四
## 2079     70584            422                       口腔外科病理專討二
## 2080     65644            422                       口腔外科病理專討四
## 2081     43577            422                     口腔顎面外科學特論二
## 2082     86516            422                         口腔診斷學實習四
## 2083     72860            422                     口腔病理學專題討論四
## 2084     69622            422                         口腔病理學特論四
## 2085     29269            422                         組織病理診斷學四
## 2086     61485            422                     牙體復形學臨床實習二
## 2087     80903            422                     牙體復形學臨床實習四
## 2088     10578            422                         美容牙科學(二)
## 2089     58418            422                         美容牙科學(四)
## 2090     77930            422                     牙科材料學專題討論二
## 2091     59512            422                     牙科材料學專題討論四
## 2092     72478            422                 口腔生醫材料文獻選讀(二)
## 2093     63315            422                       牙髓病學臨床實習二
## 2094     46212            422                       牙髓病學臨床實習四
## 2095     29712            422               口腔藥理學毒理學特論(二)
## 2096     28166            422                     牙髓病診斷與治療學二
## 2097     75903            422                     牙髓病診斷與治療學四
## 2098     70822            422                       牙髓病學專題討論二
## 2099     34195            422                       牙髓病學專題討論四
## 2100     27303            422                     牙髓病學特論及實驗二
## 2101     64584            422                               牙科理工學
## 2102     28965            422                         牙髓病治療器材學
## 2103     35962            422                       牙周病學臨床實習二
## 2104     67634            422                       牙周病學臨床實習四
## 2105     32746            422                     牙周病治療專題討論二
## 2106     69270            422                     牙周病治療專題討論四
## 2107     77403            422                     最新文獻專題討論一下
## 2108     37217            422                     最新文獻專題討論二下
## 2109     48286            422                       牙周手術專題討論二
## 2110     59310            422                       牙周手術專題討論四
## 2111     52898            422                         補綴學臨床實習二
## 2112     31868            422                         補綴學臨床實習四
## 2113     43821            422                       高級補綴學臨床實習
## 2114     85227            422                         全口重建補綴學二
## 2115     59676            422                   臨床補綴學專題討論一下
## 2116     77206            422                   高級補綴學病例討論一下
## 2117     38419            423                                 博士論文
## 2118     84849            423                                 專題討論
## 2119     24751            423                                 書報討論
## 2120     24007            423                                 書報討論
## 2121     69986            423                                 書報討論
## 2122     41903            423                                 書報討論
## 2123     72814            423                                 書報討論
## 2124     20671            423                                 書報討論
## 2125     85376            423                                 書報討論
## 2126     52010            423                                 書報討論
## 2127     76621            423                                 書報討論
## 2128     88178            423                                 書報討論
## 2129     48756            423                                 書報討論
## 2130     19826            423                                 碩士論文
## 2131     35418            423                                 專題討論
## 2132     53436            423                                 書報討論
## 2133     15506            423                                 書報討論
## 2134     52015            423                                 書報討論
## 2135     21722            423                                 書報討論
## 2136     32784            423                                 書報討論
## 2137     33042            423                                 書報討論
## 2138     28779            423                                 書報討論
## 2139     86950            423                                 書報討論
## 2140     27253            423                                 書報討論
## 2141     87764            423                                 書報討論
## 2142     45934            423                                 書報討論
## 2143     82122            423                                 書報討論
## 2144     53619            423                                 書報討論
## 2145     23323            423                                 書報討論
## 2146     12488            423                                 書報討論
## 2147     77853            423                                 書報討論
## 2148     21058            423                                 書報討論
## 2149     63489            423                           藥品安定性特論
## 2150     58806            423                               生技製藥一
## 2151     58584            423                               生技製藥二
## 2152     11853            423                                 醫藥英文
## 2153     84666            423                             藥物治療學 V
## 2154     53695            423                              藥物治療學Ⅵ
## 2155     15903            423                              藥物治療學Ⅶ
## 2156     40908            423                              藥物治療學Ⅷ
## 2157     15105            423                 加護病房臨床藥學實習(一)
## 2158     81569            423                 一般病房臨床藥學實習(一)
## 2159     17871            423                 一般病房臨床藥學實習(五)
## 2160     80849            423                 進階醫院藥事服務實習(一)
## 2161     51821            423                 進階醫院藥事服務實習(二)
## 2162     74671            423                         進階社區藥局實習
## 2163     63007            423                            藥學研究(一)
## 2164     12470            423                            藥學研究(一)
## 2165     41289            423                            藥學研究(一)
## 2166     35574            423                             藥學研究(二)
## 2167     63771            423                         進階藥政實習(一)
## 2168     68363            423                         進階藥政實習(二)
## 2169     15673            423                         進階藥廠實習(一)
## 2170     66889            424                                 博士論文
## 2171     71864            424                                 專題討論
## 2172     82446            424                                 碩士論文
## 2173     58283            424                                 專題討論
## 2174     39706            424                           實驗室教學實習
## 2175     74983            424                                 生物晶片
## 2176     62381            424                         醫學分子檢驗學上
## 2177     52906            424                         醫學分子檢驗學下
## 2178     85399            424                               細胞生物學
## 2179     39424            424                     醫學實驗室實務與認證
## 2180     14080            424                             生技產業實習
## 2181     20690            426                                 博士論文
## 2182     21693            426                                 專題研究
## 2183     41917            426                                 專題研究
## 2184     67978            426                                 專題研究
## 2185     45985            426                                 專題研究
## 2186     88001            426                                 專題研究
## 2187     73677            426                                 專題研究
## 2188     39622            426                                 專題研究
## 2189     72622            426                                 專題研究
## 2190     15731            426                                 專題研究
## 2191     60037            426                                 專題研究
## 2192     57347            426                                 專題研究
## 2193     62793            426                       護理研究專題討論二
## 2194     32165            426                     健康與疾病之護理處置
## 2195     51235            426                           質性研究法專論
## 2196     19075            426                       健康照護體系與政策
## 2197     46961            426                                 碩士論文
## 2198     45484            426                     護理行政個案分析討論
## 2199     31099            426                                 護理研究
## 2200     73252            426                       量性資料分析與判讀
## 2201     38363            426                            診斷與處置(I)
## 2202     29882            426                        專科護理師實習(I)
## 2203     80266            426                      專科護理師實習(III)
## 2204     16551            426                        臨床研究護理學(I)
## 2205     18474            426                      臨床研究護理實習(I)
## 2206     81011            426                                 實證醫學
## 2207     66648            426                       進階臨床護理學(II)
## 2208     19095            426                     進階臨床護理實習(II)
## 2209     30904            426                       進階社區護理學(II)
## 2210     36672            426                     進階社區護理實習(II)
## 2211     78881            426          職業與環境衛生護理 – 概念與實務
## 2212     28009            426                 職業與環境衛生護理學實習
## 2213     56316            426                           安寧緩和護理學
## 2214     48790            428                                 博士論文
## 2215     16033            428                 小兒物理治療學專題研究一
## 2216     75889            428                 小兒物理治療學專題研究二
## 2217     55739            428                 小兒物理治療學專題研究三
## 2218     48645            428                 小兒物理治療學專題研究四
## 2219     62275            428                 小兒物理治療學專題研究五
## 2220     68583            428                 小兒物理治療學專題研究六
## 2221     18031            428                 神經物理治療學專題研究一
## 2222     55296            428                 神經物理治療學專題研究二
## 2223     87570            428                 神經物理治療學專題研究三
## 2224     82510            428                 神經物理治療學專題研究四
## 2225     73439            428                 神經物理治療學專題研究五
## 2226     73936            428                 神經物理治療學專題研究六
## 2227     15529            428                 骨科物理治療學專題研究一
## 2228     77943            428                 骨科物理治療學專題研究二
## 2229     86210            428                 骨科物理治療學專題研究三
## 2230     70881            428                 骨科物理治療學專題研究四
## 2231     66151            428                 骨科物理治療學專題研究五
## 2232     23131            428                 骨科物理治療學專題研究六
## 2233     20541            428                 心肺物理治療學專題研究一
## 2234     68855            428                 心肺物理治療學專題研究二
## 2235     44358            428                 心肺物理治療學專題研究三
## 2236     71940            428                     臨床影像及神經影像二
## 2237     70073            428                           進階臨床實習一
## 2238     80893            428                           進階臨床實習二
## 2239     31013            428                                 碩士論文
## 2240     57923            428                   骨科物治臨床實習研究一
## 2241     41962            428                   神經物治臨床實習研究一
## 2242     23009            428                   小兒物治臨床實習研究一
## 2243     60136            428                   心肺物治臨床實習研究一
## 2244     85728            428                   骨科物治臨床實習研究二
## 2245     34167            428                   神經物治臨床實習研究二
## 2246     13075            428                   小兒物治臨床實習研究二
## 2247     25611            428                   骨科物理治療專題討論二
## 2248     20432            428                       高等物理治療評估學
## 2249     61838            428                       物理治療研究方法學
## 2250     55216            428                   高等物理治療評估學實習
## 2251     69320            428                   呼吸循環物治專題討論二
## 2252     79969            428                               專題討論二
## 2253     41021            428                   小兒物治臨床專題研究一
## 2254     19893            428                   小兒物治臨床專題研究二
## 2255     78215            428                   心肺物治臨床專題研究一
## 2256     13645            428                   心肺物治臨床專題研究二
## 2257     44439            428                   神經物治臨床專題研究一
## 2258     87797            428                   神經物治臨床專題研究二
## 2259     55245            428                   骨科物治臨床專題研究一
## 2260     76000            428                   骨科物治臨床專題研究二
## 2261     76524            428                     小兒物治臨床專題研究
## 2262     85636            428                     心肺物治臨床專題研究
## 2263     85412            428                     神經物治臨床專題研究
## 2264     60876            428                     骨科物治臨床專題研究
## 2265     46738            428                           兒童早期療育學
## 2266     13702            428                   高等神經系統物理治療學
## 2267     53845            428                   高等肌肉骨骼物理治療學
## 2268     27642            428                             高等生物力學
## 2269     74408            429                                 博士論文
## 2270     76206            429                   進階科學論文評析與寫作
## 2271     15251            429                   進階科學論文評析與寫作
## 2272     59416            429                   進階科學論文評析與寫作
## 2273     46862            429                   進階科學論文評析與寫作
## 2274     62183            429                           教學原理與實務
## 2275     36253            429                           教學原理與實務
## 2276     26588            429                           教學原理與實務
## 2277     87449            429                           教學原理與實務
## 2278     22649            429                           進階獨立研究二
## 2279     45071            429                           進階獨立研究二
## 2280     34890            429                           進階獨立研究二
## 2281     77251            429                           進階獨立研究二
## 2282     44730            429                           進階獨立研究二
## 2283     38149            429                           進階獨立研究二
## 2284     20629            429                           進階獨立研究四
## 2285     44117            429                           進階獨立研究四
## 2286     66743            429                           進階獨立研究四
## 2287     27439            429                           進階獨立研究四
## 2288     63928            429                           進階獨立研究四
## 2289     60744            429                           進階獨立研究四
## 2290     51065            429                           進階獨立研究六
## 2291     84164            429                           進階獨立研究六
## 2292     29492            429                           進階獨立研究六
## 2293     70054            429                           進階獨立研究六
## 2294     27927            429                           進階獨立研究六
## 2295     29584            429                           進階獨立研究六
## 2296     65420            429                           進階獨立研究八
## 2297     79172            429                           進階獨立研究八
## 2298     75432            429                           進階獨立研究八
## 2299     28362            429                           進階獨立研究八
## 2300     38523            429                           進階獨立研究八
## 2301     65340            429                         職能治療科學寫作
## 2302     24151            429                                 碩士論文
## 2303     34131            429                       職能治療研究方法學
## 2304     76008            429                     心理社會層面理論專題
## 2305     69992            429                               獨立研究二
## 2306     76646            429                               獨立研究二
## 2307     60819            429                               獨立研究二
## 2308     27106            429                               獨立研究二
## 2309     82155            429                               獨立研究二
## 2310     60613            429                               獨立研究二
## 2311     60442            429                               獨立研究二
## 2312     16504            429                               獨立研究二
## 2313     33569            429                               獨立研究二
## 2314     28678            429                               獨立研究二
## 2315     39395            429                               獨立研究二
## 2316     41121            429                               獨立研究四
## 2317     86902            429                               獨立研究四
## 2318     27983            429                               獨立研究四
## 2319     10840            429                               獨立研究四
## 2320     22332            429                               獨立研究四
## 2321     21109            429                               獨立研究四
## 2322     55535            429                               獨立研究四
## 2323     87008            429                               獨立研究六
## 2324     55079            429                               獨立研究六
## 2325     61224            429                               獨立研究六
## 2326     35415            429                               獨立研究六
## 2327     83847            429                               獨立研究六
## 2328     61546            429                               獨立研究八
## 2329     89364            429                     進階職能治療專題討論
## 2330     30070            441                                 博士論文
## 2331     11318            441                                 專題討論
## 2332     42669            441                                 碩士論文
## 2333     36579            441                                 專題討論
## 2334     10280            441                           神經突觸生理學
## 2335     49827            441                             分子內分泌學
## 2336     95005            441                 消化道粘膜免疫生理學特論
## 2337     26274            441                       基因體研究論著選讀
## 2338     14505            441                     神經退化研究論著選讀
## 2339     35179            442                                 博士論文
## 2340     36234            442                       生化及分生專題討論
## 2341     20883            442                             高級生化學一
## 2342     54309            442                                 碩士論文
## 2343     40978            442                             生化專題討論
## 2344     85418            442                         訊息傳遞專題討論
## 2345     32464            442                       蛋白質結構專題討論
## 2346     22683            442                   蛋白與癌症專題討論(二)
## 2347     63068            442                         營養學專題討論下
## 2348     28087            442                   疾病之分子基礎專題討論
## 2349     74488            442              功能性蛋白體醫學專題討論 II
## 2350     86509            442                     免疫與感染症專題討論
## 2351     69941            442                   金屬蛋白水解與疾病專討
## 2352     22394            442                   上皮系統生物學專題討論
## 2353     89635            442                       染色體穩定專題討論
## 2354     43621            442                  蛋白質動力學專題討論 II
## 2355     70320            442                     分子神經發育專題討論
## 2356     72313            443                                 博士論文
## 2357     34547            443                                 專題討論
## 2358     82641            443                         高等藥理學特論二
## 2359     67684            443                                 碩士論文
## 2360     19542            443                                 專題討論
## 2361     77966            443                             實驗藥理學下
## 2362     76067            443                     神經藥理學論著選讀下
## 2363     59290            443                       訊息傳遞論著選讀下
## 2364     19881            443                 心血管藥理及其訊息選讀下
## 2365     33244            444                                 博士論文
## 2366     71480            444                                 專題討論
## 2367     89108            444                           病理學及實習下
## 2368     68861            444                                 碩士論文
## 2369     16893            444                                 專題討論
## 2370     44863            444                       分子病理學專題討論
## 2371     16289            444                               實驗病理學
## 2372     17207            444                           實驗病理學實驗
## 2373     39439            445                                 博士論文
## 2374     43934            445                         微生物學專題討論
## 2375     51311            445                              EB 病毒學下
## 2376     26992            445                                 碩士論文
## 2377     41799            445                                 碩士論文
## 2378     74328            445                         微生物學專題討論
## 2379     66542            445                         寄生蟲學專題討論
## 2380     27694            445                   流行性感冒病毒免疫學下
## 2381     22236            445               微小核醣核酸調控基因表現下
## 2382     76152            445                       病毒致病之分子機制
## 2383     47922            445                             人體寄生蟲學
## 2384     77019            445                             病媒防治特論
## 2385     14350            445             病媒與寄生蟲交互關係專題討論
## 2386     38240            445                               EB病毒學下
## 2387     41647            445                   MALT-1作用機制之探討下
## 2388     15784            445                     細菌的分子致病機轉下
## 2389     19966            445                             高等微生物學
## 2390     74454            446                                 博士論文
## 2391     44242            446                           解剖學教學法二
## 2392     37661            446                                 碩士論文
## 2393     71791            446                           解剖學專題研究
## 2394     46534            446                         神經科學專題討論
## 2395     12588            446                       細胞生物學專題討論
## 2396     10550            446                             顯微解剖學二
## 2397     19308            446                               神經解剖學
## 2398     76799            446                             人體發生學二
## 2399     25976            446                         細胞生物學研究法
## 2400     12687            446                           細胞生物學導論
## 2401     15854            446                             人體解剖學二
## 2402     23495            447                                 博士論文
## 2403     81174            447                       高級實驗毒理學(二)
## 2404     13012            447                       高級毒理學專題討論
## 2405     32557            447                             分子毒理學二
## 2406     66671            447                         高級毒理學特論二
## 2407     36289            447                         高級毒理學特論四
## 2408     53144            447                                 碩士論文
## 2409     75723            447                           毒理學專題討論
## 2410     83558            447                             毒理學特論二
## 2411     10946            447                             毒理學特論四
## 2412     18275            447                           環境毒理與醫學
## 2413     11876            447                               臨床毒理學
## 2414     79907            448                                 博士論文
## 2415     62750            448                                 專題討論
## 2416     33300            448                       高等分子生物學實驗
## 2417     51347            448                       高等分子生物學特論
## 2418     67117            448                                 碩士論文
## 2419     66915            448                                 專題討論
## 2420     56551            448                           分子生物學實驗
## 2421     44053            448                     醫學遺傳學專題討論二
## 2422     63684            448                       遺傳疾病的身心影響
## 2423     15693            448                           諮商理論與技巧
## 2424     33010            448                     統計遺傳暨研究方法學
## 2425     18044            448                           細胞遺傳學實習
## 2426     12430            448                         臨床遺傳門診實習
## 2427     75868            449                                 博士論文
## 2428     82247            449                           免疫學專題討論
## 2429     77971            449                                 碩士論文
## 2430     62813            449                           免疫學專題討論
## 2431     16252            449                           臨床免疫新知一
## 2432     54478            449                           臨床免疫新知二
## 2433     76023            449                   細胞激素訊息傳遞專討下
## 2434     13123            449                   T 細胞分化與凋亡專討下
## 2435     87646            449               T 細胞分化及免疫反應專討下
## 2436     11569            449               細菌細胞交互作用專題討論下
## 2437     47867            449             感染症免疫致病機制專題討論下
## 2438     24128            449                               臨床免疫學
## 2439     79865            449                   免疫生物技術與轉譯醫學
## 2440     60524            449                 樹突細胞生物學專題討論二
## 2441     89715            449                         疹病毒免疫專討下
## 2442     49560            450                           高等生醫材料學
## 2443     72732            450                         口腔醫學實驗技術
## 2444     75433            450                     腫瘤分子與訊息傳遞學
## 2445     10522            450                       細胞代謝與修復機轉
## 2446     86967            450                                 碩士論文
## 2447     33162            450                     口腔生物科學專題討論
## 2448     77207            450                           口腔生物學特論
## 2449     62530            450                                 書報討論
## 2450     40360            450                         口腔高等生物化學
## 2451     53771            450                           口腔分子生物學
## 2452     46041            450                         基因與發生學專論
## 2453     38671            450                       核酸修復與口腔疾病
## 2454     14816            450                           腫瘤生物學特論
## 2455     51913            450                           離子通道與疾病
## 2456     83164            450                           鉀離子通道特論
## 2457     30728            450                           高等發育生物學
## 2458     22581            450                         口腔幹細胞學導論
## 2459     59470            450                       蛋白結晶繞射學概論
## 2460     70890            451                                 碩士論文
## 2461     53097            451                                 專題討論
## 2462     18637            451                                 書報討論
## 2463     75138            451                               藥物經濟學
## 2464     34837            451                             藥物治療學乙
## 2465     32819            452                                 碩士論文
## 2466     59341            452                       法醫病理學及實習二
## 2467     88508            452                     法醫分子生物學及實習
## 2468     59516            452                         法醫學專題討論二
## 2469     33944            452                 法醫物證及刑事偵察及實習
## 2470     68807            452                               臨床實習下
## 2471     75117            452                             醫療糾紛鑑定
## 2472     18115            452                         法醫學專題討論四
## 2473     75705            452                       法醫學實務實習課程
## 2474     30237            452                               司法生物學
## 2475     54876            453                                 博士論文
## 2476     68888            453                        腫瘤新知專題討論Ⅱ
## 2477     81090            453                        腫瘤新知專題討論Ⅳ
## 2478     21824            453                    轉譯癌症醫學臨床見習Ⅱ
## 2479     85347            453                               腫瘤藥理學
## 2480     29865            453                      近代腫瘤生物學特論Ⅱ
## 2481     72967            453                             高等專題研究
## 2482     17200            454                                 碩士論文
## 2483     57888            454                         腦與心智專題討論
## 2484     11399            454                       老化分子神經生物學
## 2485     17633            454                           神經表觀遺傳學
## 2486     78815            455                                 博士論文
## 2487     45512            455              基因體與蛋白體醫學書報討論Ⅱ
## 2488     88322            455               基因體與蛋白體醫學專題討論
## 2489     56044            455              基因體與蛋白體醫學書報討論Ⅳ
## 2490     31723            455                   幹細胞生物學書報討論 I
## 2491     30603            455                      小鼠遺傳學書報討論I
## 2492     27576            456                                 博士論文
## 2493     31660            456                      轉譯醫學專題討論 II
## 2494     48836            456                       轉譯醫學專題討論IV
## 2495     81318            456                                 分子醫學
## 2496     19700            456                           生物醫學統計學
## 2497     70777            456                             實驗室實習二
## 2498     35960            501                         土木工程基本實作
## 2499     20550            501                         土木工程基本實作
## 2500     61414            501                         土木工程基本實作
## 2501     21728            501                         土木工程基本實作
## 2502     12968            501                         土木工程基本實作
## 2503     78507            501                         土木工程基本實作
## 2504     41953            501                               計算機程式
## 2505     23662            501                               計算機程式
## 2506     34369            501                               計算機程式
## 2507     40636            501                               工程數學二
## 2508     84795            501                               工程數學二
## 2509     16943            501                               工程數學二
## 2510     66696            501                                 應用力學
## 2511     12506            501                                 應用力學
## 2512     53659            501                                 應用力學
## 2513     50635            501                                 流體力學
## 2514     24831            501                                 流體力學
## 2515     65968            501                                 流體力學
## 2516     42781            501                 工程材料學與土壤力學實驗
## 2517     58132            501                 工程材料學與土壤力學實驗
## 2518     79304            501                 工程材料學與土壤力學實驗
## 2519     54480            501                 工程材料學與土壤力學實驗
## 2520     88947            501                 工程材料學與土壤力學實驗
## 2521     59056            501                 工程材料學與土壤力學實驗
## 2522     48435            501                                 運輸系統
## 2523     16710            501                               工程材料學
## 2524     29542            501                               工程材料學
## 2525     26252            501                                 結構學二
## 2526     72843            501                     結構學與流體力學實驗
## 2527     74857            501                     鋼筋混凝土學及設計二
## 2528     11653            501                             土木結構系統
## 2529     86026            501                                 結構學一
## 2530     89581            501                                 結構學一
## 2531     84017            501                                 結構學一
## 2532     12259            501                                 水利工程
## 2533     71987            501                                 水利工程
## 2534     10584            501                                 水利工程
## 2535     39927            501                                 建築導論
## 2536     31313            501                                 工程經濟
## 2537     54686            501                                 工程經濟
## 2538     35792            501                                 土壤力學
## 2539     20233            501                                 土壤力學
## 2540     23328            501                                 土壤力學
## 2541     37456            501                                 營建管理
## 2542     55160            501                                 營建管理
## 2543     56200            501                     自來水及汙水處理工程
## 2544     50619            501                               預力混凝土
## 2545     95026            501                             環境保護導論
## 2546     71365            501                               學士論文下
## 2547     56420            501                               學士論文下
## 2548     30118            501                               學士論文下
## 2549     49203            501                               學士論文下
## 2550     40069            501                               學士論文下
## 2551     47106            501                               學士論文下
## 2552     82680            501                               學士論文下
## 2553     44202            501                               學士論文下
## 2554     40014            501                               學士論文下
## 2555     40784            501                               學士論文下
## 2556     12666            501                               學士論文下
## 2557     18602            501                               學士論文下
## 2558     87429            501                               學士論文下
## 2559     26695            501                               學士論文下
## 2560     41376            501                               學士論文下
## 2561     18439            501                               學士論文下
## 2562     35387            501                               學士論文下
## 2563     65878            501                               學士論文下
## 2564     18735            501                               學士論文下
## 2565     86839            501                               學士論文下
## 2566     79694            501                               學士論文下
## 2567     84053            501                               學士論文下
## 2568     61837            501                               學士論文下
## 2569     43166            501                               學士論文下
## 2570     33615            501                               學士論文下
## 2571     20336            501                               學士論文下
## 2572     66134            501                               學士論文下
## 2573     14071            501                               學士論文下
## 2574     62254            501                               學士論文下
## 2575     36108            501                               學士論文下
## 2576     63302            501                       土木工程與世界文明
## 2577     84848            502                               計算機程式
## 2578     77889            502                                 工程圖學
## 2579     53333            502                                 工程圖學
## 2580     38620            502                                 工程圖學
## 2581     45033            502                               工程數學下
## 2582     48960            502                               工程數學下
## 2583     61918            502                               工程數學下
## 2584     41409            502                                   動力學
## 2585     18990            502                                   動力學
## 2586     80625            502                                   動力學
## 2587     50630            502                                 材料力學
## 2588     78673            502                                 材料力學
## 2589     15428            502                                 材料力學
## 2590     48045            502                                 流體力學
## 2591     12617            502                                 流體力學
## 2592     13788            502                                 流體力學
## 2593     29217            502                                 機械製造
## 2594     61990            502                                 機械製造
## 2595     31763            502                                 機械製造
## 2596     37809            502                     量測原理與機工實驗二
## 2597     18636            502                     量測原理與機工實驗二
## 2598     43696            502                     量測原理與機工實驗二
## 2599     24158            502                                 流體機械
## 2600     32699            502                                   工具機
## 2601     28402            502                       工程發展與社會變遷
## 2602     75730            502                         熱處理與表面改質
## 2603     45188            502                       現代科技與人類文明
## 2604     12142            504                               計算機程式
## 2605     87459            504                               計算機程式
## 2606     13225            504                           MATLAB及其應用
## 2607     38355            504                               質能平衡甲
## 2608     81655            504                               質能平衡甲
## 2609     33998            504                               物理化學一
## 2610     41993            504                               物理化學一
## 2611     30494            504                               工程數學二
## 2612     26300            504                               工程數學二
## 2613     86001            504                                 文獻選讀
## 2614     32893            504                               單元操作二
## 2615     39987            504                               單元操作三
## 2616     68645            504                               單元操作三
## 2617     37690            504                           化學工程實驗一
## 2618     69021            504                           化學工程實驗一
## 2619     27252            504                           化學工程實驗一
## 2620     59305            504                           化學工程實驗一
## 2621     17529            504                           學士專題研究丙
## 2622     28565            504                           學士專題研究丙
## 2623     69034            504                           學士專題研究丙
## 2624     50786            504                           學士專題研究丙
## 2625     23434            504                           學士專題研究丙
## 2626     57889            504                           學士專題研究丙
## 2627     21180            504                           學士專題研究丙
## 2628     58263            504                           學士專題研究丙
## 2629     18193            504                           學士專題研究丙
## 2630     81297            504                           學士專題研究丙
## 2631     26667            504                           學士專題研究丙
## 2632     27683            504                           學士專題研究丙
## 2633     50724            504                           學士專題研究丙
## 2634     46362            504                           學士專題研究丙
## 2635     30804            504                           學士專題研究丙
## 2636     27110            504                           學士專題研究丙
## 2637     27098            504                           學士專題研究丙
## 2638     88971            504                           學士專題研究丙
## 2639     53196            504                           學士專題研究丙
## 2640     21877            504                           學士專題研究丙
## 2641     36463            504                           學士專題研究丙
## 2642     26100            504                           學士專題研究丙
## 2643     24715            504                           學士專題研究丙
## 2644     82693            504                           學士專題研究丙
## 2645     17614            504                           學士專題研究丙
## 2646     40466            504                           學士專題研究丙
## 2647     39501            504                           學士專題研究丙
## 2648     41062            504                           學士專題研究丙
## 2649     17350            504                           學士專題研究丙
## 2650     71565            504                           學士專題研究丙
## 2651     49126            504                           學士專題研究丙
## 2652     83225            504                           學士專題研究戊
## 2653     55703            504                           學士專題研究戊
## 2654     11002            504                           學士專題研究戊
## 2655     28846            504                           學士專題研究戊
## 2656     83974            504                           學士專題研究戊
## 2657     59047            504                           學士專題研究戊
## 2658     45261            504                           學士專題研究戊
## 2659     22558            504                           學士專題研究戊
## 2660     66912            504                           學士專題研究戊
## 2661     30329            504                           學士專題研究戊
## 2662     19386            504                           學士專題研究戊
## 2663     26731            504                           學士專題研究戊
## 2664     61897            504                           學士專題研究戊
## 2665     21277            504                           學士專題研究戊
## 2666     39346            504                           學士專題研究戊
## 2667     28310            504                           學士專題研究戊
## 2668     46708            504                           學士專題研究戊
## 2669     17936            504                           學士專題研究戊
## 2670     81874            504                           學士專題研究戊
## 2671     70634            504                           學士專題研究戊
## 2672     20924            504                           學士專題研究戊
## 2673     26340            504                           學士專題研究戊
## 2674     46946            504                           學士專題研究戊
## 2675     44762            504                             化學反應工程
## 2676     13600            504                             化學反應工程
## 2677     85866            504                                 程序控制
## 2678     33020            504                             化學工業程序
## 2679     62055            504                             化學工業程序
## 2680     57497            505                           工程及海工概論
## 2681     10402            505                                 微積分下
## 2682     30492            505                                 電子學二
## 2683     34707            505                             中等流體力學
## 2684     84912            505                         物件導向程式語言
## 2685     33617            505                                 線性代數
## 2686     27636            505                                   動力學
## 2687     54194            505                                   熱力學
## 2688     78057            505                               工程數學二
## 2689     15025            505                                 數值方法
## 2690     63799            505                           工程及專業倫理
## 2691     84226            505                                 電磁學二
## 2692     36136            505                               光機電實驗
## 2693     39509            505                               光機電實驗
## 2694     38142            505                                 力學實驗
## 2695     81305            505                                 離散數學
## 2696     83409            505                                   結構學
## 2697     54445            505                               系統動力學
## 2698     73507            507                           材料科學導論二
## 2699     32201            507                                 程式設計
## 2700     42007            507                               工程數學下
## 2701     82259            507                               物理冶金下
## 2702     88719            507                           高分子材料概論
## 2703     76778            507                     材料科學與工程實驗二
## 2704     35618            507                             無機材料製程
## 2705     16096            507                             材料熱力學二
## 2706     51725            521                                 博士論文
## 2707     72100            521                                 輸砂特論
## 2708     34062            521                                 碩士論文
## 2709     65757            521                         水利工程專題討論
## 2710     74411            521                         大地工程專題討論
## 2711     50965            521                         運輸工程專題討論
## 2712     16191            521                       交通安全設計與分析
## 2713     89196            521                                 塑性力學
## 2714     85341            521                               有限元素法
## 2715     62584            521                                 隧道工程
## 2716     13273            521                             土壤組成模式
## 2717     30624            521                             大地地震工程
## 2718     73366            521                             黏性流體力學
## 2719     18741            521                        BIM導入實務與演練
## 2720     59958            521                         營建管理專題討論
## 2721     59118            521                           鋪面設計與管理
## 2722     30973            521                         結構力學專題討論
## 2723     40568            521                     電腦輔助工程專題討論
## 2724     11323            521                     電腦輔助工程專案研究
## 2725     54427            521                         營建管理專案研究
## 2726     85844            521                             攝影測量特論
## 2727     36751            521                             測量專題討論
## 2728     26036            521                       跨領域聯合專題討論
## 2729     88063            521                             學術英文寫作
## 2730     73453            521                           工程契約與規範
## 2731     84620            521                           工程經濟與應用
## 2732     22482            521                         工程風險管理實務
## 2733     65074            521                                 遙感探測
## 2734     75544            521                                 專案管理
## 2735     32546            521                       計量實證研究方法論
## 2736     78518            521                           鋼結構耐震設計
## 2737     16409            521                       高科技廠房設施營建
## 2738     72924            521                           衛星大地測量學
## 2739     46340            521                           智慧型結構系統
## 2740     20045            521                       衛星大地測量學特論
## 2741     88782            521                       運輸系統的創新管理
## 2742     16421            521                   隨機過程與不確定性分析
## 2743     42925            521                               地貌水力學
## 2744     53720            521                               工程數學四
## 2745     54762            521                               明渠水力學
## 2746     76035            521                         基礎設計與施工一
## 2747     13113            521                     瀝青混凝土及配合設計
## 2748     88247            521                             離散元素分析
## 2749     25171            521                       測量及空間資訊概論
## 2750     49861            521                           軌道營運與管理
## 2751     69372            521                    災害管理 - 政策與實務
## 2752     50950            521                 大地工程可靠度分析與設計
## 2753     15246            521                 視覺化技術在工程上之應用
## 2754     88872            521                       土木工程實務與實習
## 2755     50117            521                           旅行者行為分析
## 2756     54795            521                             捷運系統工程
## 2757     85133            522                                 博士論文
## 2758     57147            522                             博士專題研究
## 2759     39317            522                             博士專題研究
## 2760     72131            522                             博士專題研究
## 2761     86391            522                             博士專題研究
## 2762     53584            522                             博士專題研究
## 2763     77803            522                             博士專題研究
## 2764     83668            522                             博士專題研究
## 2765     57308            522                             博士專題研究
## 2766     74553            522                             博士專題研究
## 2767     84839            522                             博士專題研究
## 2768     16749            522                             博士專題研究
## 2769     76493            522                             博士專題研究
## 2770     63730            522                             博士專題研究
## 2771     59023            522                             博士專題研究
## 2772     57349            522                             博士專題研究
## 2773     61704            522                             博士專題研究
## 2774     35063            522                             博士專題研究
## 2775     79747            522                             博士專題研究
## 2776     81848            522                             博士專題研究
## 2777     86426            522                             博士專題研究
## 2778     34476            522                             博士專題研究
## 2779     46610            522                             博士專題研究
## 2780     34126            522                             博士專題研究
## 2781     36383            522                             博士專題研究
## 2782     73979            522                             博士專題研究
## 2783     17038            522                             博士專題研究
## 2784     52903            522                             博士專題研究
## 2785     25401            522                             博士專題研究
## 2786     25463            522                             博士專題研究
## 2787     65318            522                             博士專題研究
## 2788     88157            522                             博士專題研究
## 2789     59541            522                             博士專題研究
## 2790     31732            522                             博士專題研究
## 2791     35255            522                             博士專題研究
## 2792     49918            522                             博士專題研究
## 2793     34825            522                             博士專題研究
## 2794     41969            522                             博士專題研究
## 2795     22948            522                             博士專題研究
## 2796     27603            522                             博士專題研究
## 2797     74498            522                             博士專題研究
## 2798     69232            522                                 碩士論文
## 2799     72547            522                                 專題討論
## 2800     84173            522                                 專題討論
## 2801     32499            522                                 專題討論
## 2802     63862            522                                 專題討論
## 2803     11351            522                                 專題討論
## 2804     66291            522                                 專題討論
## 2805     15971            522                                 專題討論
## 2806     51967            522                             碩士專題研究
## 2807     78392            522                             碩士專題研究
## 2808     51153            522                             碩士專題研究
## 2809     81452            522                             碩士專題研究
## 2810     18162            522                             碩士專題研究
## 2811     70557            522                             碩士專題研究
## 2812     73741            522                             碩士專題研究
## 2813     75054            522                             碩士專題研究
## 2814     13107            522                             碩士專題研究
## 2815     13904            522                             碩士專題研究
## 2816     33795            522                             碩士專題研究
## 2817     82536            522                             碩士專題研究
## 2818     87313            522                             碩士專題研究
## 2819     71601            522                             碩士專題研究
## 2820     81938            522                             碩士專題研究
## 2821     89141            522                             碩士專題研究
## 2822     38414            522                             碩士專題研究
## 2823     37384            522                             碩士專題研究
## 2824     26987            522                             碩士專題研究
## 2825     72742            522                             碩士專題研究
## 2826     22939            522                             碩士專題研究
## 2827     33313            522                             碩士專題研究
## 2828     81682            522                             碩士專題研究
## 2829     83289            522                             碩士專題研究
## 2830     13280            522                             碩士專題研究
## 2831     11977            522                             碩士專題研究
## 2832     49691            522                             碩士專題研究
## 2833     58315            522                             碩士專題研究
## 2834     10097            522                             碩士專題研究
## 2835     55098            522                             碩士專題研究
## 2836     14384            522                             碩士專題研究
## 2837     89622            522                             碩士專題研究
## 2838     18517            522                             碩士專題研究
## 2839     69489            522                             碩士專題研究
## 2840     79353            522                             碩士專題研究
## 2841     58398            522                             碩士專題研究
## 2842     22585            522                             碩士專題研究
## 2843     22377            522                             碩士專題研究
## 2844     29748            522                             碩士專題研究
## 2845     49692            522                             碩士專題研究
## 2846     15914            522                             碩士專題研究
## 2847     59165            522                             碩士專題研究
## 2848     89158            522                             碩士專題研究
## 2849     51214            522                             碩士專題研究
## 2850     48718            522                             碩士專題研究
## 2851     62844            522                             碩士專題研究
## 2852     70395            522                             碩士專題研究
## 2853     56287            522                             碩士專題研究
## 2854     32759            522                             碩士專題研究
## 2855     69198            522                             碩士專題研究
## 2856     23901            522                             碩士專題研究
## 2857     25051            522                             碩士專題研究
## 2858     33056            522                             碩士專題研究
## 2859     69200            522                             碩士專題研究
## 2860     67134            522                             碩士專題研究
## 2861     86600            522                             碩士專題研究
## 2862     45325            522                           可壓縮流體力學
## 2863     31969            522                             應用塑性力學
## 2864     75094            522                                 強韌控制
## 2865     36908            522                               機器動力學
## 2866     72567            522                               智慧型控制
## 2867     79114            522                               彈性穩定學
## 2868     71067            522                             學士專題研究
## 2869     43727            522                             學士專題研究
## 2870     17086            522                             學士專題研究
## 2871     36446            522                             學士專題研究
## 2872     55898            522                             學士專題研究
## 2873     16537            522                             學士專題研究
## 2874     89915            522                             學士專題研究
## 2875     75796            522                             學士專題研究
## 2876     71627            522                             學士專題研究
## 2877     29110            522                             學士專題研究
## 2878     23881            522                             學士專題研究
## 2879     59777            522                             學士專題研究
## 2880     42916            522                             學士專題研究
## 2881     25070            522                             學士專題研究
## 2882     25196            522                             學士專題研究
## 2883     58829            522                             學士專題研究
## 2884     17017            522                             學士專題研究
## 2885     81771            522                             學士專題研究
## 2886     69588            522                             學士專題研究
## 2887     21302            522                             學士專題研究
## 2888     65473            522                             學士專題研究
## 2889     10157            522                             學士專題研究
## 2890     54281            522                             學士專題研究
## 2891     76933            522                             學士專題研究
## 2892     51489            522                             學士專題研究
## 2893     80277            522                             學士專題研究
## 2894     74985            522                             學士專題研究
## 2895     39135            522                             學士專題研究
## 2896     28342            522                             學士專題研究
## 2897     35986            522                             學士專題研究
## 2898     83292            522                             學士專題研究
## 2899     44215            522                             學士專題研究
## 2900     38708            522                             學士專題研究
## 2901     54491            522                             學士專題研究
## 2902     19932            522                             學士專題研究
## 2903     88654            522                             學士專題研究
## 2904     48463            522                             學士專題研究
## 2905     32946            522                             學士專題研究
## 2906     16927            522                             學士專題研究
## 2907     11797            522                             學士專題研究
## 2908     78659            522                             學士專題研究
## 2909     32391            522                             學士專題研究
## 2910     53387            522                             學士專題研究
## 2911     11972            522                             學士專題研究
## 2912     95006            522                             學士專題研究
## 2913     13898            522                                 機構設計
## 2914     71267            522                               中等動力學
## 2915     59234            522                         冷凍機設計實作一
## 2916     60079            522                           自動機器設計一
## 2917     11284            522                         奈米工程技術概論
## 2918     75024            522                         微處理器控制系統
## 2919     22183            522                               系統動態學
## 2920     67645            522                             生活科技概論
## 2921     81875            522                                 專利工程
## 2922     19186            522                                 能源工程
## 2923     64245            522                             機械元件設計
## 2924     13801            522                 自動化光學檢測原理與應用
## 2925     17756            522                         電腦輔助工程製圖
## 2926     50210            522                           固液二相流導論
## 2927     64681            522                                 創新設計
## 2928     42064            522                       設計自動化與最佳化
## 2929     67228            522                             心臟醫學工程
## 2930     51391            522                         連體機電力學導論
## 2931     35274            522                       研究執行與成果發表
## 2932     51911            522                     生醫奈米機電系統導論
## 2933     85054            522                       車輛工程實務與實習
## 2934     95030            522                   感應電機設計與控制專題
## 2935     84853            524                                 博士論文
## 2936     58224            524                             博士專題研究
## 2937     69836            524                             博士專題研究
## 2938     13842            524                             博士專題研究
## 2939     44746            524                             博士專題研究
## 2940     17124            524                             博士專題研究
## 2941     54820            524                             博士專題研究
## 2942     79222            524                             博士專題研究
## 2943     30897            524                             博士專題研究
## 2944     40766            524                             博士專題研究
## 2945     29682            524                             博士專題研究
## 2946     77395            524                             博士專題研究
## 2947     17093            524                             博士專題研究
## 2948     22893            524                             博士專題研究
## 2949     31726            524                             博士專題研究
## 2950     44512            524                             博士專題研究
## 2951     22047            524                             博士專題研究
## 2952     25700            524                             博士專題研究
## 2953     41859            524                             博士專題研究
## 2954     11946            524                             博士專題研究
## 2955     47659            524                             博士專題研究
## 2956     45540            524                             博士專題研究
## 2957     15793            524                             博士專題研究
## 2958     67523            524                             博士專題研究
## 2959     30257            524                             博士專題研究
## 2960     72497            524                             博士專題研究
## 2961     17437            524                             博士專題研究
## 2962     74388            524                             博士專題研究
## 2963     85727            524                             博士專題研究
## 2964     63691            524                             博士專題研究
## 2965     42165            524                             博士專題研究
## 2966     32541            524                             博士專題研究
## 2967     78336            524                             博士專題研究
## 2968     19483            524                                 碩士論文
## 2969     56272            524                                 專題討論
## 2970     85781            524                           膠體與界面現象
## 2971     47765            524                           高等化工熱力學
## 2972     16835            524                           高等化工熱力學
## 2973     17341            524                           高等熱質量傳遞
## 2974     77727            524                           高等熱質量傳遞
## 2975     79780            524                             高等程序控制
## 2976     38247            524                         電腦輔助程序設計
## 2977     72717            524                           碩士專題研究二
## 2978     33633            524                           碩士專題研究二
## 2979     65979            524                           碩士專題研究二
## 2980     40276            524                           碩士專題研究二
## 2981     80421            524                           碩士專題研究二
## 2982     47481            524                           碩士專題研究二
## 2983     86566            524                           碩士專題研究二
## 2984     86400            524                           碩士專題研究二
## 2985     85444            524                           碩士專題研究二
## 2986     10751            524                           碩士專題研究二
## 2987     11107            524                           碩士專題研究二
## 2988     70397            524                           碩士專題研究二
## 2989     17743            524                           碩士專題研究二
## 2990     37017            524                           碩士專題研究二
## 2991     80953            524                           碩士專題研究二
## 2992     20973            524                           碩士專題研究二
## 2993     65316            524                           碩士專題研究二
## 2994     59833            524                           碩士專題研究二
## 2995     12013            524                           碩士專題研究二
## 2996     26533            524                           碩士專題研究二
## 2997     38187            524                           碩士專題研究二
## 2998     88115            524                           碩士專題研究二
## 2999     80326            524                           碩士專題研究二
## 3000     41307            524                           碩士專題研究二
## 3001     33940            524                           碩士專題研究二
## 3002     69797            524                           碩士專題研究二
## 3003     31894            524                           碩士專題研究二
## 3004     72985            524                           碩士專題研究二
## 3005     19886            524                           碩士專題研究二
## 3006     58107            524                           碩士專題研究二
## 3007     13233            524                           碩士專題研究二
## 3008     62693            524                           碩士專題研究二
## 3009     47531            524                           碩士專題研究二
## 3010     59368            524                           碩士專題研究二
## 3011     38688            524                           碩士專題研究四
## 3012     13411            524                           碩士專題研究四
## 3013     29759            524                           碩士專題研究四
## 3014     42216            524                           碩士專題研究四
## 3015     74350            524                           碩士專題研究四
## 3016     52057            524                           碩士專題研究四
## 3017     81059            524                           碩士專題研究四
## 3018     36218            524                           碩士專題研究四
## 3019     71459            524                           碩士專題研究四
## 3020     41605            524                           碩士專題研究四
## 3021     42545            524                           碩士專題研究四
## 3022     56987            524                           碩士專題研究四
## 3023     48671            524                           碩士專題研究四
## 3024     76537            524                           碩士專題研究四
## 3025     67116            524                           碩士專題研究四
## 3026     53550            524                           碩士專題研究四
## 3027     56688            524                           碩士專題研究四
## 3028     76204            524                           碩士專題研究四
## 3029     60539            524                           碩士專題研究四
## 3030     62902            524                           碩士專題研究四
## 3031     25791            524                           碩士專題研究四
## 3032     17312            524                           碩士專題研究四
## 3033     18607            524                           碩士專題研究四
## 3034     79607            524                           碩士專題研究四
## 3035     68809            524                           碩士專題研究四
## 3036     65805            524                           碩士專題研究四
## 3037     68767            524                           碩士專題研究四
## 3038     51345            524                           碩士專題研究四
## 3039     77116            524                           碩士專題研究四
## 3040     83583            524                           碩士專題研究四
## 3041     36255            524                           碩士專題研究四
## 3042     80281            524                           碩士專題研究四
## 3043     27366            524                           碩士專題研究四
## 3044     17192            524                           碩士專題研究四
## 3045     64177            524                           碩士專題研究四
## 3046     68162            524                                 觸媒化學
## 3047     14469            524                             材料科學概論
## 3048     10421            524                       薄膜技術與表面分析
## 3049     24314            524                             中等數值方法
## 3050     26717            524                             石化工業程序
## 3051     88348            524                               高分子材料
## 3052     74107            524                   生化分離及生物程序工程
## 3053     75693            525                                 博士論文
## 3054     70126            525                                 專題討論
## 3055     70179            525                                 專題研究
## 3056     35386            525                                 專題研究
## 3057     38698            525                                 專題研究
## 3058     67555            525                                 專題研究
## 3059     77252            525                                 專題研究
## 3060     39130            525                                 專題研究
## 3061     67067            525                                 專題研究
## 3062     34460            525                                 專題研究
## 3063     38669            525                                 專題研究
## 3064     49756            525                                 專題研究
## 3065     48160            525                                 專題研究
## 3066     56874            525                                 專題研究
## 3067     37816            525                                 專題研究
## 3068     56135            525                                 專題研究
## 3069     80467            525                                 專題研究
## 3070     22931            525                                 專題研究
## 3071     15357            525                                 碩士論文
## 3072     12775            525                                 專題討論
## 3073     78433            525                                 專題討論
## 3074     46025            525                                 專題研究
## 3075     57860            525                                 專題研究
## 3076     73638            525                                 專題研究
## 3077     14267            525                                 專題研究
## 3078     67034            525                                 專題研究
## 3079     82048            525                                 專題研究
## 3080     33136            525                                 專題研究
## 3081     48390            525                                 專題研究
## 3082     16355            525                                 專題研究
## 3083     63725            525                                 專題研究
## 3084     58149            525                                 專題研究
## 3085     84440            525                                 專題研究
## 3086     61196            525                                 專題研究
## 3087     62478            525                                 專題研究
## 3088     16633            525                                 專題研究
## 3089     56243            525                                 專題研究
## 3090     83625            525                                 專題研究
## 3091     44218            525                                 專題研究
## 3092     82409            525                                 專題研究
## 3093     88712            525                                 專題研究
## 3094     46868            525                                 專題研究
## 3095     21670            525                                 專題研究
## 3096     74286            525                       高等工程數學特論一
## 3097     44032            525                           進階流體動力學
## 3098     23255            525                             資訊檢索特論
## 3099     86721            525                             光電元件專論
## 3100     37479            525                                 專題研究
## 3101     42325            525                                 專題研究
## 3102     83676            525                                 專題研究
## 3103     84837            525                                 專題研究
## 3104     78850            525                                 專題研究
## 3105     62867            525                                 專題研究
## 3106     55857            525                                 專題研究
## 3107     80139            525                                 專題研究
## 3108     55248            525                                 專題研究
## 3109     31067            525                                 專題研究
## 3110     43462            525                                 專題研究
## 3111     18074            525                                 專題研究
## 3112     59564            525                                 專題研究
## 3113     37138            525                                 專題研究
## 3114     83451            525                                 專題研究
## 3115     54285            525                                 專題研究
## 3116     38795            525                                 專題研究
## 3117     31935            525                         產業應用發展概論
## 3118     24302            525                       數值計算之工程應用
## 3119     48810            525                                 工程美學
## 3120     73323            525                               機率與統計
## 3121     56774            525                                 水下聲學
## 3122     51279            525                                 船舶推進
## 3123     23541            525                     虛擬儀控之設計與應用
## 3124     46398            525                 高功率半導體元件設計分析
## 3125     45226            527                                 博士論文
## 3126     10114            527                             博士專題研究
## 3127     12027            527                             博士專題研究
## 3128     43591            527                             博士專題研究
## 3129     40369            527                             博士專題研究
## 3130     66188            527                             博士專題研究
## 3131     14088            527                             博士專題研究
## 3132     51474            527                             博士專題研究
## 3133     74778            527                             博士專題研究
## 3134     66907            527                             博士專題研究
## 3135     77793            527                             博士專題研究
## 3136     61348            527                             博士專題研究
## 3137     80476            527                             博士專題研究
## 3138     19181            527                             博士專題研究
## 3139     47824            527                             博士專題研究
## 3140     24439            527                             博士專題研究
## 3141     79092            527                             博士專題研究
## 3142     62016            527                             博士專題研究
## 3143     82677            527                             博士專題研究
## 3144     61655            527                             博士專題研究
## 3145     45986            527                             博士專題研究
## 3146     89442            527                             博士專題研究
## 3147     69036            527                                 碩士論文
## 3148     47662            527                             碩士專題研究
## 3149     79476            527                             碩士專題研究
## 3150     35571            527                             碩士專題研究
## 3151     80743            527                             碩士專題研究
## 3152     67559            527                             碩士專題研究
## 3153     47939            527                             碩士專題研究
## 3154     79334            527                             碩士專題研究
## 3155     23756            527                             碩士專題研究
## 3156     32082            527                             碩士專題研究
## 3157     54280            527                             碩士專題研究
## 3158     11540            527                             碩士專題研究
## 3159     15360            527                             碩士專題研究
## 3160     61349            527                             碩士專題研究
## 3161     80321            527                             碩士專題研究
## 3162     23422            527                             碩士專題研究
## 3163     21604            527                             碩士專題研究
## 3164     12573            527                             碩士專題研究
## 3165     83998            527                             碩士專題研究
## 3166     74514            527                             碩士專題研究
## 3167     64058            527                             碩士專題研究
## 3168     45851            527                             碩士專題研究
## 3169     57112            527                             碩士專題研究
## 3170     35641            527                             碩士專題研究
## 3171     10631            527                             碩士專題研究
## 3172     88081            527                             碩士專題研究
## 3173     67429            527                                 專題討論
## 3174     88167            527                       生醫工程與材料設計
## 3175     78173            527                             鋼鐵製程專論
## 3176     29388            527                                X光繞射學
## 3177     74267            527                               材料動力學
## 3178     66958            527                               晶體結構學
## 3179     40969            527                                 磁性材料
## 3180     14670            527                                 相變態學
## 3181     62767            527                             陶瓷複合材料
## 3182     71172            527                 高分子物理化學:基本原理
## 3183     79843            527                                 金屬材料
## 3184     13053            527                           學士專題研究二
## 3185     44556            527                           學士專題研究二
## 3186     51564            527                           學士專題研究二
## 3187     22263            527                           學士專題研究二
## 3188     83236            527                           學士專題研究二
## 3189     79312            527                           學士專題研究二
## 3190     25992            527                           學士專題研究二
## 3191     52044            527                           學士專題研究二
## 3192     86349            527                           學士專題研究二
## 3193     16540            527                           學士專題研究二
## 3194     22555            527                           學士專題研究二
## 3195     71461            527                           學士專題研究二
## 3196     85736            527                           學士專題研究二
## 3197     74509            527                           學士專題研究二
## 3198     37459            527                           學士專題研究二
## 3199     83391            527                           學士專題研究二
## 3200     83617            527                           學士專題研究二
## 3201     22967            527                           學士專題研究二
## 3202     17197            527                           學士專題研究二
## 3203     51315            527                           學士專題研究四
## 3204     49331            527                           學士專題研究四
## 3205     67476            527                           學士專題研究四
## 3206     57984            527                           學士專題研究四
## 3207     39434            527                           學士專題研究四
## 3208     88534            527                           學士專題研究四
## 3209     46825            527                           學士專題研究四
## 3210     80330            527                           學士專題研究四
## 3211     42953            527                           學士專題研究四
## 3212     89760            527                           學士專題研究四
## 3213     16251            527                               奈米電子學
## 3214     79216            527                             金屬玻璃特論
## 3215     52191            527                   固態燃料電池原理與技術
## 3216     45213            527                             合成有機化學
## 3217     38048            541                                 博士論文
## 3218     27436            541                                 專題討論
## 3219     39379            541                           環境新興污染物
## 3220     31021            541                             環境有機化學
## 3221     34471            541                                 碩士論文
## 3222     77467            541                                 專題研究
## 3223     74787            541                                 專題討論
## 3224     47915            541                                 專題討論
## 3225     59353            541                               環境生態學
## 3226     13878            541                             環境系統分析
## 3227     89795            541                           粒狀物控制理論
## 3228     23959            541                       環境風險分析與實習
## 3229     78019            541                       環境影響評估及實習
## 3230     45005            541                           環境趨勢與策略
## 3231     26966            541                                 水質管理
## 3232     62999            541                             生物處理方法
## 3233     21198            541                             水及廢水處理
## 3234     27635            541                         空氣污染控制設計
## 3235     63147            541                             生態工法概論
## 3236     80458            543                                 博士論文
## 3237     38032            543                                 專題討論
## 3238     75055            543                                 碩士論文
## 3239     19227            543                               專題討論一
## 3240     77069            543                               專題討論一
## 3241     88025            543                                 專題研究
## 3242     52759            543                                 專題研究
## 3243     63362            543                                 專題研究
## 3244     76522            543                                 專題研究
## 3245     45550            543                                 專題研究
## 3246     30989            543                                 專題研究
## 3247     55298            543                                 專題研究
## 3248     70907            543                                 專題研究
## 3249     79717            543                                 專題研究
## 3250     61187            543                                 專題研究
## 3251     87939            543                                 專題研究
## 3252     72760            543                                 專題研究
## 3253     37505            543                                 專題研究
## 3254     23116            543                                 專題研究
## 3255     40681            543                                 專題研究
## 3256     68393            543                                 專題研究
## 3257     20088            543                                 專題研究
## 3258     55775            543                                 專題研究
## 3259     45266            543                                 專題研究
## 3260     27259            543                                 專題研究
## 3261     56080            543                                 專題研究
## 3262     63156            543                                 專題研究
## 3263     73445            543                                 專題研究
## 3264     89996            543                                 專題研究
## 3265     84970            543                                 專題研究
## 3266     70248            543                                 專題研究
## 3267     51971            543                               應用數學一
## 3268     83380            543                         工程科學數值方法
## 3269     78731            543                               電子學實驗
## 3270     68325            543                               電子學實驗
## 3271     40305            543                           應用力學實驗一
## 3272     61602            543                           應用力學實驗一
## 3273     21194            543                           應用力學實驗一
## 3274     72269            543                           應用力學實驗二
## 3275     50200            543                                   動力學
## 3276     25205            543                           載具動力與控制
## 3277     89436            543                                 量子力學
## 3278     28172            543                                   電磁學
## 3279     23264            543                               彈性力學一
## 3280     48578            543                               應力波動學
## 3281     39333            543                               生物電磁學
## 3282     73149            543                   細胞微機電及微流體導論
## 3283     35167            543                   壓電晶體波傳與聲波元件
## 3284     28180            543                             流體力學導論
## 3285     40533            543                             醫用流體力學
## 3286     61388            543                               軟物質導論
## 3287     28514            543                   光機電系統設計與製造二
## 3288     49511            543                     壓電振動能量擷取導論
## 3289     41950            543                                 材料力學
## 3290     87511            543                           實驗室晶片導論
## 3291     53828            543                         現代熱流量測技術
## 3292     34280            544                                 博士論文
## 3293     49018            544                                 論文寫作
## 3294     60932            544                                 碩士論文
## 3295     25666            544                     環境規劃設計實習二 A
## 3296     76828            544                     環境規劃設計實習一下
## 3297     20974            544                     環境規劃設計實習一下
## 3298     75899            544                     環境規劃設計實習一下
## 3299     79707            544                               性別與環境
## 3300     25986            544                           城鄉安全與防災
## 3301     45937            544                           空間的社會分析
## 3302     44750            544                               自然與城市
## 3303     78972            544                         區域經濟發展專題
## 3304     41659            544                     初等環境與建築設計二
## 3305     67048            546                                 博士論文
## 3306     33100            546                             博士專題研究
## 3307     57029            546                             博士專題研究
## 3308     54664            546                             博士專題研究
## 3309     76043            546                             博士專題研究
## 3310     79891            546                             博士專題研究
## 3311     31071            546                             博士專題研究
## 3312     49305            546                             博士專題研究
## 3313     83416            546                             博士專題研究
## 3314     79655            546                             博士專題研究
## 3315     27883            546                                 碩士論文
## 3316     20310            546                                 專題研究
## 3317     11116            546                                 專題研究
## 3318     38629            546                                 專題研究
## 3319     89574            546                                 專題研究
## 3320     68887            546                                 專題研究
## 3321     19272            546                                 專題研究
## 3322     42646            546                                 專題研究
## 3323     37739            546                                 專題研究
## 3324     54522            546                                 專題研究
## 3325     17215            546                                 專題研究
## 3326     23237            546                                 專題研究
## 3327     48315            546                                 專題研究
## 3328     28558            546                                 專題研究
## 3329     67963            546                                 專題研究
## 3330     15935            546                                 專題討論
## 3331     31839            546                           跨領域專題討論
## 3332     41347            546                               非線性規劃
## 3333     63875            546                         整數與組合最佳化
## 3334     11273            546                       產業風險評估與管理
## 3335     19125            546                 統計管制與最佳化方法概論
## 3336     75363            548                                 博士論文
## 3337     59408            548                             博士專題研究
## 3338     38577            548                             博士專題研究
## 3339     52252            548                             博士專題研究
## 3340     36244            548                             博士專題研究
## 3341     25427            548                             博士專題研究
## 3342     29873            548                             博士專題研究
## 3343     19493            548                             博士專題研究
## 3344     75786            548                             博士專題研究
## 3345     74399            548                             博士專題研究
## 3346     16192            548                             博士專題研究
## 3347     81108            548                             博士專題研究
## 3348     25419            548                             博士專題研究
## 3349     79154            548                             博士專題研究
## 3350     25478            548                             博士專題研究
## 3351     49719            548                             博士專題研究
## 3352     59326            548                     高等醫學工程專題討論
## 3353     89087            548                                 碩士論文
## 3354     23211            548                                 專題研究
## 3355     36055            548                                 專題研究
## 3356     53004            548                                 專題研究
## 3357     29705            548                                 專題研究
## 3358     80994            548                                 專題研究
## 3359     39752            548                                 專題研究
## 3360     71781            548                                 專題研究
## 3361     60557            548                                 專題研究
## 3362     53847            548                                 專題研究
## 3363     68969            548                                 專題研究
## 3364     10057            548                                 專題研究
## 3365     89950            548                                 專題研究
## 3366     70460            548                                 專題研究
## 3367     41256            548                                 專題研究
## 3368     23677            548                                 專題研究
## 3369     10295            548                         醫學工程專題討論
## 3370     65661            548                           高分子材料分析
## 3371     14086            548                             醫學影像分析
## 3372     52418            548                             感覺神經生理
## 3373     40691            548                     數學在醫工上之應用下
## 3374     52871            548                           生醫奈微米工程
## 3375     79191            548                             醫用輻射物理
## 3376     54976            548                                 生醫物理
## 3377     46464            548                     生醫機械系統之最佳化
## 3378     21609            548                   義肢與矯具學臨床實習下
## 3379     55432            548                 人體動作分析電腦計算方法
## 3380     28970            548                       義肢矯具學設計原理
## 3381     33976            548                   義肢矯具學臨床案例研討
## 3382     49276            548                   大腦功能及結構磁振造影
## 3383     77421            548                             醫學工程專利
## 3384     65354            548                 生理與解剖在醫工之應用二
## 3385     77601            548                       皮膚再生與發育專題
## 3386     36493            548                         生醫創新與商業化
## 3387     62068            548                             脊椎生物力學
## 3388     53275            548                         生物醫學材料概論
## 3389     55896            549                                 博士論文
## 3390     10203            549                           博士專題研究二
## 3391     54361            549                           博士專題研究二
## 3392     48999            549                           博士專題研究二
## 3393     52722            549                           博士專題研究二
## 3394     45498            549                           博士專題研究二
## 3395     46620            549                           博士專題研究二
## 3396     12686            549                           博士專題研究四
## 3397     42365            549                           博士專題研究四
## 3398     88261            549                           博士專題研究四
## 3399     20749            549                           博士專題研究四
## 3400     82025            549                                 碩士論文
## 3401     88836            549                                 專題討論
## 3402     62400            549                             高分子形態學
## 3403     47404            549                           高分子物理化學
## 3404     82321            549                           功能性高分子上
## 3405     61230            549                             高分子分析學
## 3406     18845            549                            高分子實驗 II
## 3407     54080            549                       光電高分子科技專論
## 3408     51772            549                       生物高分子科技專論
## 3409     63404            549                           碩士專題研究二
## 3410     42367            549                           碩士專題研究二
## 3411     73893            549                           碩士專題研究二
## 3412     84421            549                           碩士專題研究二
## 3413     17389            549                           碩士專題研究二
## 3414     48510            549                           碩士專題研究二
## 3415     64467            549                           碩士專題研究二
## 3416     36685            549                           碩士專題研究二
## 3417     47344            549                           碩士專題研究二
## 3418     11235            549                           碩士專題研究二
## 3419     66736            549                           碩士專題研究二
## 3420     75186            549                           碩士專題研究三
## 3421     95033            549                           碩士專題研究三
## 3422     12748            601                             作物生產概論
## 3423     49656            601                           現代農業體驗一
## 3424     85036            601                           現代農業體驗一
## 3425     15066            601                           現代農業體驗一
## 3426     27749            601                           現代農業體驗一
## 3427     71439            601                           現代農業體驗一
## 3428     84336            601                           現代農業體驗一
## 3429     77626            601                           現代農業體驗二
## 3430     69713            601                           現代農業體驗二
## 3431     45131            601                           現代農業體驗二
## 3432     16415            601                           現代農業體驗二
## 3433     67380            601                           現代農業體驗二
## 3434     69584            601                           現代農業體驗二
## 3435     66643            601                           現代農業體驗二
## 3436     35129            601                           田園生活體驗一
## 3437     32579            601                           田園生活體驗一
## 3438     60404            601                           田園生活體驗一
## 3439     45323            601                           田園生活體驗一
## 3440     19765            601                           田園生活體驗二
## 3441     58685            601                           田園生活體驗二
## 3442     10102            601                           田園生活體驗二
## 3443     47572            601                           田園生活體驗二
## 3444     61992            601                           田園生活體驗二
## 3445     16178            601                           田園生活體驗二
## 3446     22439            601                           田園生活體驗二
## 3447     60923            601                                   遺傳學
## 3448     65139            601                                   統計學
## 3449     35959            601                                   統計學
## 3450     16004            601                                 作物學甲
## 3451     62835            601                               遺傳學實驗
## 3452     52074            601                               遺傳學實驗
## 3453     26386            601                             作物學各論二
## 3454     77790            601                             作物學實習二
## 3455     37422            601                             作物育種方法
## 3456     21456            601                               專題討論上
## 3457     73454            601                               專題討論下
## 3458     64201            602                               工程數學二
## 3459     36678            602                                 空間資訊
## 3460     36629            602                             流體力學試驗
## 3461     13942            602                             流體力學試驗
## 3462     12896            602                             環境化學實習
## 3463     89757            602                             環境化學實習
## 3464     39685            602                     計算機應用及程式語言
## 3465     51701            602                                   水文學
## 3466     12179            602                                   生態學
## 3467     58291            602                             土壤力學試驗
## 3468     52539            602                             土壤力學試驗
## 3469     48692            602                               專題研究二
## 3470     64921            602                               專題研究二
## 3471     86341            602                               專題研究二
## 3472     36358            602                               專題研究二
## 3473     53831            602                               專題研究二
## 3474     51609            602                               專題研究二
## 3475     81703            602                               專題研究二
## 3476     25330            602                               專題研究二
## 3477     50279            602                               專題研究二
## 3478     57126            602                               專題研究二
## 3479     28999            602                               專題研究二
## 3480     86111            602                               專題研究二
## 3481     17345            602                               專題研究二
## 3482     33974            602                               專題研究二
## 3483     80177            602                               專題研究二
## 3484     46578            602                               專題研究二
## 3485     87095            602                               專題研究二
## 3486     51259            602                               專題研究二
## 3487     89340            602                               專題研究二
## 3488     59507            603                             普通微生物學
## 3489     54833            603                         普通微生物學實驗
## 3490     17579            603                         普通微生物學實驗
## 3491     52756            603                                 環境化學
## 3492     85137            603                               食品化學二
## 3493     64145            603                               植物營養學
## 3494     14123            603                           植物營養學實驗
## 3495     25179            603                           植物營養學實驗
## 3496     58099            603                               專題討論下
## 3497     81674            603                               專題研究二
## 3498     83610            603                               專題研究二
## 3499     17974            603                               專題研究二
## 3500     67462            603                               專題研究二
## 3501     38906            603                               專題研究二
## 3502     45293            603                               專題研究二
## 3503     68797            603                               專題研究二
## 3504     86047            603                               專題研究二
## 3505     51595            603                               專題研究二
## 3506     10963            603                               專題研究二
## 3507     54915            603                               專題研究二
## 3508     28988            603                               專題研究二
## 3509     32097            603                               專題研究二
## 3510     82065            603                               專題研究二
## 3511     41783            605                             樹木學及實習
## 3512     75503            605                             樹木學及實習
## 3513     74814            605                         森林土壤學及實驗
## 3514     62286            605                         木材物理學及實驗
## 3515     65094            605                       台灣傳統木建築概論
## 3516     73811            605                           鳥類生態與保育
## 3517     48461            605                       森林生物多樣性概論
## 3518     83159            605                       森林生物多樣性概論
## 3519     47126            605                       森林生物多樣性概論
## 3520     25177            605                       森林生物多樣性概論
## 3521     59845            605                       森林生物多樣性概論
## 3522     16616            605                       森林生物多樣性概論
## 3523     10299            605                   林場實習資源保育及管理
## 3524     26476            605                                   林政學
## 3525     68528            605                     林木生理生態學及實習
## 3526     24537            605                               森林水文學
## 3527     43613            605                               專題討論下
## 3528     57439            605                               專題討論下
## 3529     80076            605                               專題討論下
## 3530     61161            605                               專題討論下
## 3531     33411            605                               專題討論下
## 3532     81340            605                               學士論文下
## 3533     63778            605                               學士論文下
## 3534     17335            605                               學士論文下
## 3535     63161            605                               學士論文下
## 3536     88979            605                               學士論文下
## 3537     87906            605                               學士論文下
## 3538     49788            605                               學士論文下
## 3539     10594            605                               學士論文下
## 3540     70451            605                               學士論文下
## 3541     52920            605                               學士論文下
## 3542     30561            605                               學士論文下
## 3543     73525            605                             森林遊樂概論
## 3544     71276            606                                   遺傳學
## 3545     50410            606                               遺傳學實習
## 3546     87201            606                               豬營養學甲
## 3547     25053            606                                 寵物營養
## 3548     62268            606                               細胞生理學
## 3549     52108            606                                 專題研究
## 3550     69183            606                                 專題研究
## 3551     11588            606                                 專題研究
## 3552     77009            606                                 專題研究
## 3553     73198            606                                 專題研究
## 3554     89095            606                                 專題研究
## 3555     64758            606                                 專題研究
## 3556     34980            606                                 專題研究
## 3557     69316            606                                 專題研究
## 3558     26549            606                                 專題研究
## 3559     58217            606                                 專題研究
## 3560     12691            606                                 專題研究
## 3561     38264            606                                 專題研究
## 3562     51130            606                                 專題研究
## 3563     14758            606                                 專題研究
## 3564     52851            606                                 專題研究
## 3565     12163            606                               專題討論下
## 3566     84151            606                               專題討論下
## 3567     51034            606                               專題討論下
## 3568     78959            606                               專題討論下
## 3569     46902            606                               專題討論下
## 3570     79875            606                               專題討論下
## 3571     84543            606                               專題討論下
## 3572     14996            606                               專題討論下
## 3573     20712            606                               專題討論下
## 3574     10345            606                               專題討論下
## 3575     58588            606                               專題討論下
## 3576     37339            606                               專題討論下
## 3577     24519            606                               專題討論下
## 3578     86588            606                               專題討論下
## 3579     42755            606                               專題討論下
## 3580     12762            606                               專題討論下
## 3581     43560            606                         動物解剖生理學下
## 3582     86207            606                     動物解剖生理學實習下
## 3583     63690            606                               動物育種學
## 3584     95035            606                                   飼料學
## 3585     63546            606                             動物內分泌學
## 3586     10945            606                               動物代謝學
## 3587     71881            606                       經濟動物行為與福祉
## 3588     44101            606                           動物生產自動化
## 3589     36924            606                               伴侶動物學
## 3590     67474            606                               動物衛生學
## 3591     79449            606                           動物資源經營學
## 3592     38172            606                               發育生物學
## 3593     14660            606                   基因體學與生物資訊工具
## 3594     13785            607                             經濟學原理下
## 3595     36097            607                                 統計學下
## 3596     45257            607                           個體經濟學甲下
## 3597     29937            607                           總體經濟學甲下
## 3598     95036            607                           國際農產貿易一
## 3599     16575            607                               農產運銷學
## 3600     82759            607                                 農產價格
## 3601     33473            607                                 農業金融
## 3602     37578            607                                 農業發展
## 3603     19558            607                     中國大陸農業經濟問題
## 3604     68607            607                       農業經濟問題討論二
## 3605     23263            607                     環境與自然資源經濟學
## 3606     65229            608                         園場操作與經營二
## 3607     76936            608                                   造園學
## 3608     59566            608                               造園學實習
## 3609     89957            608                                   果樹學
## 3610     86985            608                               果樹學實習
## 3611     54837            608                             園產品加工學
## 3612     80009            608                         園產品加工學實習
## 3613     64453            608                         景觀設計及實習一
## 3614     28174            608                         景觀設計及實習三
## 3615     38021            608                                   景觀學
## 3616     12371            608                               落葉果樹二
## 3617     86520            608                       景觀工程學及實習二
## 3618     37331            608                             海外景觀研習
## 3619     36932            608                             景觀專業實務
## 3620     48547            608                           園藝作物育種學
## 3621     50034            608                       園藝作物育種學實習
## 3622     46177            608                               專題討論下
## 3623     70935            608                               專題討論下
## 3624     12513            608                               畢業設計二
## 3625     17666            608                               畢業設計二
## 3626     69132            608                               畢業設計二
## 3627     40632            608                               畢業設計二
## 3628     76449            608                               學士論文下
## 3629     66229            608                               學士論文下
## 3630     56011            608                               學士論文下
## 3631     11423            608                               學士論文下
## 3632     15539            608                               學士論文下
## 3633     36376            609                         獸醫細菌學及實習
## 3634     58142            609                         獸醫細菌學及實習
## 3635     59535            609                                   胚胎學
## 3636     78190            609                                   胚胎學
## 3637     78410            609                       獸醫解剖學及實習下
## 3638     28933            609                       獸醫解剖學及實習下
## 3639     80272            609                             獸醫生理學下
## 3640     84498            609                             獸醫生理學下
## 3641     65072            609                           獸醫生理學實習
## 3642     28627            609                           獸醫生理學實習
## 3643     46376            609                       獸醫病理學及實習下
## 3644     86609            609                       獸醫病理學及實習下
## 3645     68840            609                     小動物外科手術及實習
## 3646     55697            609                     小動物外科手術及實習
## 3647     43126            609                         獸醫病毒學及實習
## 3648     12108            609                         獸醫病毒學及實習
## 3649     12965            609                         獸醫藥理學及實習
## 3650     22120            609                         獸醫藥理學及實習
## 3651     75003            609                               獸醫遺傳學
## 3652     59275            609                         獸醫麻醉學及實習
## 3653     29697            609                         獸醫麻醉學及實習
## 3654     13058            609                           獸醫臨床病理學
## 3655     67490            609                           獸醫臨床病理學
## 3656     59459            609                       獸醫臨床病理學實習
## 3657     38470            609                       獸醫臨床病理學實習
## 3658     77690            609                       獸醫繁殖障礙及產科
## 3659     83119            609                       獸醫繁殖障礙及產科
## 3660     64116            609                             小動物外科學
## 3661     44533            609                             小動物內科學
## 3662     29098            609                               專題研究下
## 3663     68904            609                               專題研究下
## 3664     41719            609                               專題研究下
## 3665     43057            609                               專題研究下
## 3666     43210            609                               專題研究下
## 3667     56548            609                               專題研究下
## 3668     15075            609                               專題研究下
## 3669     88715            609                               專題研究下
## 3670     40652            609                               專題研究下
## 3671     41885            609                               專題研究下
## 3672     52469            609                               專題研究下
## 3673     62548            609                               專題研究下
## 3674     65411            609                               專題研究下
## 3675     28165            609                               專題研究下
## 3676     66636            609                               專題研究下
## 3677     12021            609                             獸醫流行病學
## 3678     46300            609                             診療實習二甲
## 3679     67065            609                             診療實習二甲
## 3680     73547            609                               臨床討論二
## 3681     44775            609                               臨床討論二
## 3682     25421            609                               屍體解剖二
## 3683     83207            609                               屍體解剖二
## 3684     76757            609                       人畜共通傳染病概論
## 3685     57836            609                   關懷生命愛護動物實習一
## 3686     71208            609                               學士論文下
## 3687     79888            609                               學士論文下
## 3688     66874            609                               學士論文下
## 3689     58800            609                               學士論文下
## 3690     38866            609                               學士論文下
## 3691     38674            609                               學士論文下
## 3692     56700            609                   關懷生命愛護動物實習二
## 3693     25324            610                                 媒體素養
## 3694     63304            610                             數位媒體設計
## 3695     26376            610                                     實習
## 3696     69917            610                                     實習
## 3697     72928            610                           鄉村與文化研究
## 3698     45972            610                                   廣告學
## 3699     11664            611                               機械與農業
## 3700     64524            611          微控制器原理與應用-機電整合(一)
## 3701     62414            611                               工程數學二
## 3702     17235            611                               應用力學一
## 3703     87133            611                                 材料力學
## 3704     51699            611                                 機動學一
## 3705     29250            611                         生物產業工程實習
## 3706     23467            611                         生物產業工程實習
## 3707     84891            611                         生物產業工程實習
## 3708     78677            611                         生物產業工程實習
## 3709     29543            611                         生物產業工程實習
## 3710     26997            611                         生物產業工程實習
## 3711     18502            611                         生物產業工程實習
## 3712     85546            611                         生物產業工程實習
## 3713     24363            611                         生物產業工程實習
## 3714     25944            611                                 流體力學
## 3715     27064            611                         機械元件設計(一)
## 3716     20286            611                             電子學與實習
## 3717     35505            611            致動器原理與應用-機電整合(三)
## 3718     43411            611                                 專題研究
## 3719     74085            611                                 專題研究
## 3720     36790            611                                 專題研究
## 3721     49754            611                                 專題研究
## 3722     69524            611                                 專題研究
## 3723     66883            611                                 專題研究
## 3724     44206            611                                 專題研究
## 3725     55284            611                                 專題研究
## 3726     23608            611                                 專題研究
## 3727     89245            611                                 專題研究
## 3728     85589            611                                 專題研究
## 3729     33201            611                                 專題研究
## 3730     85853            611                                 專題研究
## 3731     63937            611                                 專題研究
## 3732     82722            611                                 專題研究
## 3733     74777            611                                 專題研究
## 3734     51378            611                                 專題研究
## 3735     77393            611                                 專題研究
## 3736     37494            611                                 專題研究
## 3737     36490            611                                 專題研究
## 3738     63048            611                                 專題研究
## 3739     58990            611                                 專題研究
## 3740     21976            611                               學士專題二
## 3741     85974            611                               學士專題二
## 3742     60901            611                               學士專題二
## 3743     39518            611                               學士專題二
## 3744     12735            611                               學士專題二
## 3745     68126            611                               學士專題二
## 3746     10450            611                               學士專題二
## 3747     43368            611                               學士專題二
## 3748     56598            611                               學士專題二
## 3749     14934            611                               學士專題二
## 3750     64958            611                               學士專題二
## 3751     40433            611                               學士專題二
## 3752     53298            611                               學士專題二
## 3753     14598            611                               學士專題二
## 3754     53804            611                               學士專題二
## 3755     11071            611                               學士專題二
## 3756     19036            611                               學士專題二
## 3757     86806            611                               學士專題二
## 3758     10478            611                               學士專題二
## 3759     15696            611                               學士專題二
## 3760     69880            612                             普通昆蟲學下
## 3761     34467            612                         普通昆蟲學實習下
## 3762     34390            612                   生物時鐘與睡眠醫學概論
## 3763     46352            612                             蟲害管理原理
## 3764     39037            612                         生物技術專題研究
## 3765     83272            612                               農業藥劑學
## 3766     41789            612                             昆蟲分類學下
## 3767     49009            612                         昆蟲分類學實習下
## 3768     14462            612                             農業昆蟲學甲
## 3769     88926            612                               昆蟲生理學
## 3770     33328            612                           昆蟲生理學實習
## 3771     47425            612                                 專題研究
## 3772     77581            612                                 專題研究
## 3773     14570            612                                 專題研究
## 3774     43522            612                                 專題研究
## 3775     26757            612                                 專題研究
## 3776     80352            612                                 專題研究
## 3777     30122            612                               學士論文下
## 3778     35842            612                               學士論文下
## 3779     23307            612                               學士論文下
## 3780     69942            612                               學士論文下
## 3781     73343            612                               學士論文下
## 3782     20882            613                             應用微生物學
## 3783     76721            613                               植病防治學
## 3784     79600            613                                 微生物學
## 3785     31888            613                             微生物學實驗
## 3786     41203            613                                   遺傳學
## 3787     13472            613                             植物病理學乙
## 3788     63941            621                                 博士論文
## 3789     20533            621                                 專題討論
## 3790     13611            621                                 專題討論
## 3791     48813            621                                 碩士論文
## 3792     62526            621                                 專題討論
## 3793     22621            621                                 專題討論
## 3794     85445            621                           高等作物生理學
## 3795     32899            621                           高等作物育種學
## 3796     65956            621                                 統計計算
## 3797     11441            621                         高等生物統計法二
## 3798     20929            621                             作物生長分化
## 3799     44226            621                               分子遺傳學
## 3800     23883            621                             作物基因工程
## 3801     83256            621                           作物分子育種學
## 3802     42783            621                                   咖啡學
## 3803     20140            621                             統計應用軟體
## 3804     34483            621                       有機農業管理與實務
## 3805     12947            621                   複因子試驗之設計與分析
## 3806     89830            622                                 博士論文
## 3807     14945            622                                 專題討論
## 3808     39250            622                             土壤沖蝕特論
## 3809     80765            622                             學術英文寫作
## 3810     57186            622                                 碩士論文
## 3811     87134            622                                 專題討論
## 3812     59015            622                                 專題討論
## 3813     80586            622                                 專題討論
## 3814     78147            622                                 專題討論
## 3815     14038            622                               書報研讀二
## 3816     79852            622                               書報研讀二
## 3817     13692            622                               書報研讀二
## 3818     52306            622                               書報研讀二
## 3819     29080            622                               書報研讀二
## 3820     41339            622                               書報研讀二
## 3821     89605            622                               書報研讀二
## 3822     95038            622                               書報研讀二
## 3823     62127            622                               書報研讀二
## 3824     16212            622                               書報研讀二
## 3825     51129            622                               書報研讀二
## 3826     48101            622                               書報研讀二
## 3827     20887            622                               書報研讀二
## 3828     53067            622                               書報研讀二
## 3829     48222            622                               書報研讀二
## 3830     75635            622                               書報研讀二
## 3831     75269            622                               書報研讀二
## 3832     67582            622                               書報研讀二
## 3833     46653            622                               書報研讀二
## 3834     87336            622                               書報研讀二
## 3835     10279            622                               書報研讀二
## 3836     24487            622                             環境流體力學
## 3837     95034            622                               孔隙介質流
## 3838     52208            622                             養殖工程設計
## 3839     17860            622                                 生態工程
## 3840     46207            622                             環境系統分析
## 3841     80525            622                             水土保持工程
## 3842     67346            622                               環境計測學
## 3843     68329            622                       生物科技與污染防治
## 3844     31236            622                                 微氣候學
## 3845     32297            622                           水庫環境與泥砂
## 3846     35222            622                             空間資訊分析
## 3847     79767            622                               序率水文學
## 3848     14843            622                               渠道水力學
## 3849     55228            622                       景觀生態量測與規劃
## 3850     15920            622                         國際農業工程服務
## 3851     46351            623                                 博士論文
## 3852     75546            623                                 專題討論
## 3853     57381            623                                 專題討論
## 3854     40149            623                               專題研究二
## 3855     88781            623                               專題研究二
## 3856     37887            623                               專題研究二
## 3857     71537            623                               專題研究二
## 3858     45067            623                               專題研究二
## 3859     64860            623                               專題研究二
## 3860     59322            623                               專題研究二
## 3861     38597            623                               專題研究二
## 3862     51969            623                               專題研究二
## 3863     34815            623                               專題研究二
## 3864     10900            623                               專題研究二
## 3865     70833            623                               專題研究四
## 3866     86975            623                               專題研究四
## 3867     26790            623                               專題研究四
## 3868     23628            623                               專題研究四
## 3869     61119            623                               專題研究四
## 3870     40859            623                               專題研究四
## 3871     85088            623                               專題研究四
## 3872     42530            623                               專題研究四
## 3873     20052            623                               專題研究四
## 3874     84135            623                               專題研究四
## 3875     76271            623                               專題研究四
## 3876     88724            623                               專題研究四
## 3877     66799            623                                 碩士論文
## 3878     65054            623                                 專題討論
## 3879     28192            623                                 專題討論
## 3880     78872            623                               專題研究二
## 3881     67792            623                               專題研究二
## 3882     36912            623                               專題研究二
## 3883     74120            623                               專題研究二
## 3884     82883            623                               專題研究二
## 3885     86916            623                               專題研究二
## 3886     53347            623                               專題研究二
## 3887     40078            623                               專題研究二
## 3888     69827            623                               專題研究二
## 3889     80864            623                               專題研究二
## 3890     10241            623                               專題研究二
## 3891     21580            623                               專題研究二
## 3892     30625            623                               專題研究二
## 3893     47904            623                               專題研究二
## 3894     10544            623                               專題研究二
## 3895     42145            623                               專題研究二
## 3896     72727            623                       農化研究及實驗法二
## 3897     11080            623                       農化研究及實驗法三
## 3898     63668            623                           環境有機化學二
## 3899     57883            623                                 脂質化學
## 3900     41574            623                         土壤化學儀器分析
## 3901     80827            623                           穀物原料及加工
## 3902     31929            623                                 農業藥劑
## 3903     38870            623                     土壤污染物傳輸與動態
## 3904     66913            623                   污染土壤調查與整治技術
## 3905     26506            623                             土壤物理化學
## 3906     31694            623                             土壤表面化學
## 3907     44296            623                           醣類化學與應用
## 3908     23294            623                             微生物遺傳學
## 3909     39954            623                                 藥用植物
## 3910     88691            623                             環境奈米科技
## 3911     41421            623                       細胞分子機制及調控
## 3912     80184            625                                 博士論文
## 3913     43694            625                                 專題討論
## 3914     66870            625                                 專題討論
## 3915     25017            625                                 專題討論
## 3916     63319            625                                 專題討論
## 3917     33090            625                           林木分子育種學
## 3918     33781            625                                 碩士論文
## 3919     39070            625                                 專題討論
## 3920     61518            625                                 專題討論
## 3921     46173            625                                 專題討論
## 3922     44715            625                                 專題討論
## 3923     61673            625                                 專題討論
## 3924     48021            625                                 專題研究
## 3925     77312            625                                 專題研究
## 3926     51589            625                                 專題研究
## 3927     34874            625                                 專題研究
## 3928     37398            625                                 專題研究
## 3929     28656            625                                 專題研究
## 3930     54846            625                                 專題研究
## 3931     82334            625                                 專題研究
## 3932     39667            625                                 專題研究
## 3933     55402            625                                 專題研究
## 3934     25710            625                                 專題研究
## 3935     63055            625                                 專題研究
## 3936     24603            625                                 專題研究
## 3937     69415            625                                 專題研究
## 3938     76324            625                                 專題研究
## 3939     45774            625                                 專題研究
## 3940     84596            625                                 專題研究
## 3941     82364            625                                 專題研究
## 3942     88880            625                                 專題研究
## 3943     83228            625                               森林影響學
## 3944     45069            625                   自然保護區的議題與研究
## 3945     15855            625                             林產化學特論
## 3946     37743            625                             森林食植行為
## 3947     53642            625                               木質環境學
## 3948     57058            625                       林木分子遺傳學特論
## 3949     33772            625                         生態水文研究特論
## 3950     19000            625                         水土資源研究特論
## 3951     19395            625                       生態資料探勘與分析
## 3952     79418            625                       細胞壁結構分析特論
## 3953     73434            625                         觀光遊憩研究特論
## 3954     72659            625                     生物材料物性研究分析
## 3955     12521            625                   林產工業之環境污染防治
## 3956     21943            625                     社區保育的議題與個案
## 3957     24975            625                 木質構造建築設計與施工二
## 3958     65802            625                     陸域生物地球化學概論
## 3959     73575            625                   植物細胞壁生物合成化學
## 3960     41863            625                           森林環境物理學
## 3961     54713            625                               土壤物理學
## 3962     88443            625                  探索臺灣:自然環境與資源
## 3963     72156            625                  探索臺灣:自然環境與資源
## 3964     22255            625                         生物複合材料力學
## 3965     76656            626                                 博士論文
## 3966     78115            626                                 專題討論
## 3967     17576            626                                 專題討論
## 3968     49452            626                                 專題討論
## 3969     47366            626                                 專題討論
## 3970     51847            626                                 專題討論
## 3971     20179            626                                 專題討論
## 3972     48059            626                                 專題討論
## 3973     59307            626                                 專題討論
## 3974     48200            626                               生理遺傳學
## 3975     75666            626                           動物生理學特論
## 3976     82442            626                                 碩士論文
## 3977     61434            626                           家畜生殖技術學
## 3978     78135            626                       反芻動物營養與代謝
## 3979     29848            626                             乳品生物技術
## 3980     68044            626                                 幹細胞學
## 3981     55168            626                       動物產品微生物特論
## 3982     23585            626                         養豬廢水處理技術
## 3983     71315            626                         動物科學專題討論
## 3984     88076            626                         生產技術專題討論
## 3985     65140            626                 動物性保健食品開發特論一
## 3986     22726            626                         動物科學研究法乙
## 3987     16448            626                       經濟動物行為與福祉
## 3988     71643            627                                 博士論文
## 3989     58006            627                           計量經濟學專論
## 3990     42356            627                       應用一般均衡分析一
## 3991     75938            627                                 碩士論文
## 3992     22196            627                               專題討論二
## 3993     95039            627                         農產貿易政策分析
## 3994     11304            627                           個體經濟理論二
## 3995     78269            627                             總體經濟理論
## 3996     54499            627                               生物經濟學
## 3997     12978            627                             數學規劃專論
## 3998     60296            627                       休閒農業理論與實務
## 3999     36510            627                           財務分析與管理
## 4000     42052            627                       應用一般均衡模型一
## 4001     12929            627                               專題研究四
## 4002     27226            627                               專題研究四
## 4003     20640            627                               專題研究四
## 4004     39178            627                               專題研究四
## 4005     89799            627                               專題研究四
## 4006     69380            627                               專題研究四
## 4007     40223            627                               專題研究四
## 4008     76200            627                               專題研究四
## 4009     74534            627                               專題研究四
## 4010     65440            627                               專題研究四
## 4011     42847            627                               專題研究四
## 4012     54363            627                               專題研究四
## 4013     40061            627                               專題研究四
## 4014     19283            627                               專題研究四
## 4015     31204            627                               專題研究四
## 4016     81375            627                               專題研究四
## 4017     76322            627                               專題研究四
## 4018     61107            627                               專題研究四
## 4019     27036            627                               專題研究四
## 4020     33099            627                               專題研究四
## 4021     13741            627                               專題研究四
## 4022     56836            627                               專題研究四
## 4023     89692            627                                 農產行銷
## 4024     18134            627                           應用個體經濟學
## 4025     14282            627                             農企業管理學
## 4026     30514            627                             農業政策分析
## 4027     69979            627                             國際農業合作
## 4028     26481            627                             國際農業體驗
## 4029     57690            627                               應用投資學
## 4030     56672            627                             計量經濟學二
## 4031     76777            627                             高等統計學二
## 4032     70893            627                               作業研究一
## 4033     71470            627                               專題研究二
## 4034     44001            627                               專題研究二
## 4035     50351            627                               專題研究二
## 4036     67680            627                               專題研究二
## 4037     40788            627                               專題研究二
## 4038     23393            627                       全球環境與資源安全
## 4039     57806            628                                 博士論文
## 4040     31854            628                               專題討論一
## 4041     85843            628                               專題討論一
## 4042     34426            628                               專題討論一
## 4043     85628            628                               專題討論二
## 4044     79749            628                               專題討論二
## 4045     29317            628                               專題討論二
## 4046     36703            628                       植物分子生物學特論
## 4047     88665            628                               專題研究二
## 4048     28570            628                               專題研究二
## 4049     89061            628                               專題研究二
## 4050     78343            628                               專題研究二
## 4051     31462            628                               專題研究二
## 4052     44210            628                               專題研究二
## 4053     52782            628                               專題研究二
## 4054     69569            628                               專題研究二
## 4055     42087            628                               專題研究二
## 4056     15925            628                               專題研究二
## 4057     39940            628                               專題研究二
## 4058     24233            628                               專題研究二
## 4059     46841            628                               專題研究二
## 4060     56214            628                               專題研究二
## 4061     57547            628                               專題研究二
## 4062     45418            628                               專題研究四
## 4063     42467            628                               專題研究四
## 4064     16993            628                               專題研究四
## 4065     36086            628                               專題研究四
## 4066     33621            628                               專題研究四
## 4067     52859            628                               專題研究四
## 4068     83229            628                               專題研究四
## 4069     19259            628                               專題研究四
## 4070     42533            628                               專題研究四
## 4071     84737            628                               專題研究四
## 4072     29109            628                               專題研究四
## 4073     12514            628                               專題研究四
## 4074     33390            628                               專題研究四
## 4075     88871            628                                 碩士論文
## 4076     38580            628                               專題討論一
## 4077     32220            628                               專題討論一
## 4078     76019            628                               專題討論一
## 4079     52982            628                               專題討論一
## 4080     17289            628                               專題討論二
## 4081     20156            628                               專題討論二
## 4082     84354            628                               專題討論二
## 4083     36426            628                               專題討論二
## 4084     87704            628                             高級果樹學一
## 4085     86890            628                               高級蔬菜學
## 4086     88387            628                               高級花卉學
## 4087     26883            628                               高級造園學
## 4088     88422            628                               專題研究二
## 4089     23550            628                               專題研究二
## 4090     69765            628                               專題研究二
## 4091     48916            628                               專題研究二
## 4092     79326            628                               專題研究二
## 4093     82758            628                               專題研究二
## 4094     38554            628                               專題研究二
## 4095     29427            628                               專題研究二
## 4096     19534            628                               專題研究二
## 4097     10559            628                               專題研究二
## 4098     10948            628                               專題研究二
## 4099     18561            628                               專題研究二
## 4100     53609            628                               專題研究二
## 4101     79518            628                               專題研究二
## 4102     34335            628                               專題研究二
## 4103     16216            628                               專題研究二
## 4104     33524            628                               專題研究二
## 4105     57271            628                               專題研究二
## 4106     16028            628                               專題研究二
## 4107     50040            628                               專題研究二
## 4108     69246            628                               專題研究四
## 4109     16932            628                               專題研究四
## 4110     28757            628                               專題研究四
## 4111     25250            628                               專題研究四
## 4112     19372            628                               專題研究四
## 4113     26831            628                               專題研究四
## 4114     31977            628                               專題研究四
## 4115     89089            628                               專題研究四
## 4116     86375            628                               專題研究四
## 4117     56638            628                               專題研究四
## 4118     16972            628                               專題研究四
## 4119     85172            628                               專題研究四
## 4120     37989            628                               專題研究四
## 4121     40688            628                               專題研究四
## 4122     11220            628                               專題研究四
## 4123     71808            628                               專題研究四
## 4124     74358            628                               專題研究四
## 4125     13115            628                               專題研究四
## 4126     45885            628                               專題研究四
## 4127     14602            628                         景觀研究計量方法
## 4128     73495            628                           園藝學研究法二
## 4129     65226            628                     園產品鑑別技術特論二
## 4130     66160            628                             發酵微生物學
## 4131     85871            628                           園藝植物化學一
## 4132     26105            628                               設施園藝二
## 4133     68733            628                           植物分子生物學
## 4134     72923            628                                 作物遺傳
## 4135     27291            628                             景觀草本植物
## 4136     28147            628                              重組DNA技術
## 4137     73963            628                           園產品處理技術
## 4138     20158            628                               景觀生態學
## 4139     20452            628                 電腦輔助景觀模擬與表現法
## 4140     39149            628                                 茶與茶業
## 4141     33713            628                             作物栽培特論
## 4142     43804            628                       健康景觀設計及實習
## 4143     78756            629                                 博士論文
## 4144     85932            629                               專題討論二
## 4145     66171            629                               專題討論四
## 4146     32025            629                               專題研究二
## 4147     15679            629                               專題研究二
## 4148     41934            629                               專題研究二
## 4149     40055            629                               專題研究二
## 4150     56476            629                               專題研究二
## 4151     78642            629                               專題研究四
## 4152     79775            629                               專題討論六
## 4153     32191            629                                 碩士論文
## 4154     47069            629                               專題研究二
## 4155     32969            629                               專題研究二
## 4156     73812            629                               專題研究二
## 4157     44393            629                               專題研究二
## 4158     22523            629                               專題研究二
## 4159     16366            629                               專題研究二
## 4160     83518            629                               專題研究二
## 4161     55021            629                               專題研究二
## 4162     47590            629                               專題研究二
## 4163     13125            629                               專題研究二
## 4164     80948            629                               專題研究四
## 4165     15111            629                               專題研究四
## 4166     63279            629                               專題研究四
## 4167     22335            629                               專題研究四
## 4168     45591            629                               專題研究四
## 4169     22625            629                               專題研究四
## 4170     85255            629                               專題研究四
## 4171     59446            629                               專題研究四
## 4172     21455            629                         基礎組專題討論二
## 4173     55765            629                         基礎組專題討論四
## 4174     58948            629                         公衛組專題討論四
## 4175     57658            629                       高等獸醫細菌學一下
## 4176     68422            629                           免疫毒理學特論
## 4177     19997            629                             細胞微生物學
## 4178     50857            629                           人畜共同傳染病
## 4179     57073            629                   動物園與野生動物疾病學
## 4180     61042            629                             小動物齒科學
## 4181     88164            629                     癌症生物及免疫學特論
## 4182     71190            629                                   動物權
## 4183     76384            629                 小動物臨床營養及病例討論
## 4184     29497            629                       小動物行為醫學特論
## 4185     87806            629                         獸醫臨床微生物學
## 4186     71475            629                           獸醫細菌遺傳學
## 4187     36454            629                           骨再生醫學概論
## 4188     83440            629                       小動物超音波影像學
## 4189     72374            630                                 博士論文
## 4190     35390            630                             區域發展理論
## 4191     63987            630                                 碩士論文
## 4192     16288            630                             文化景觀研究
## 4193     79082            630                                 發展理論
## 4194     71748            630                             風險傳播專題
## 4195     49228            630                                 行銷專題
## 4196     16718            630                                 人口研究
## 4197     69635            630                         量化研究寫作專題
## 4198     31991            630                                 綠色行銷
## 4199     14219            630                                 科學傳播
## 4200     31783            631                                 博士論文
## 4201     72756            631                                 專題討論
## 4202     44980            631                                 專題研究
## 4203     53729            631                                 專題研究
## 4204     40427            631                                 專題研究
## 4205     70612            631                                 專題研究
## 4206     46443            631                                 專題研究
## 4207     11240            631                                 專題研究
## 4208     25185            631                                 專題研究
## 4209     69229            631                                 專題研究
## 4210     48204            631                                 專題研究
## 4211     16382            631                                 專題研究
## 4212     16240            631                                 專題研究
## 4213     62519            631                                 專題研究
## 4214     19753            631                                 專題研究
## 4215     65513            631                                 專題研究
## 4216     16621            631                                 專題研究
## 4217     70872            631                                 專題研究
## 4218     89943            631                                 專題研究
## 4219     18062            631                           生物機電特論下
## 4220     88959            631                                 碩士論文
## 4221     21495            631                                 專題討論
## 4222     46643            631                                 專題研究
## 4223     40438            631                                 專題研究
## 4224     51774            631                                 專題研究
## 4225     65561            631                                 專題研究
## 4226     89183            631                                 專題研究
## 4227     56054            631                                 專題研究
## 4228     35466            631                                 專題研究
## 4229     21028            631                                 專題研究
## 4230     53323            631                                 專題研究
## 4231     38835            631                                 專題研究
## 4232     85164            631                                 專題研究
## 4233     53403            631                                 專題研究
## 4234     29891            631                                 專題研究
## 4235     56936            631                                 專題研究
## 4236     62541            631                                 專題研究
## 4237     64622            631                                 專題研究
## 4238     39540            631                                 專題研究
## 4239     84931            631                                 專題研究
## 4240     54154            631                                 專題研究
## 4241     25245            631                                 專題研究
## 4242     42406            631                                 專題研究
## 4243     31118            631                                 專題研究
## 4244     78496            631                                 系統工程
## 4245     44097            631                       試驗設計之工程應用
## 4246     48963            631                                 信號處理
## 4247     86734            631                   無線感測器網路技術導論
## 4248     89724            631                               生機特論下
## 4249     49426            631                               生物材料學
## 4250     16296            631                               智慧型控制
## 4251     36935            631                             生物廢水工程
## 4252     77152            631                                   數值法
## 4253     74083            631                       生物系統模擬與分析
## 4254     19560            632                                 博士論文
## 4255     81417            632                                 專題討論
## 4256     53629            632                                 碩士論文
## 4257     55163            632                                 專題討論
## 4258     43838            632                     幼期昆蟲分類學及實習
## 4259     63051            632                           昆蟲分類學特論
## 4260     53025            632                           昆蟲生態學特論
## 4261     55213            632                      DNA與胚胎發育多樣性
## 4262     15189            632                         科學研究計畫管理
## 4263     44674            632                               昆蟲與植病
## 4264     77133            632                               生態研究法
## 4265     70680            632                       研究方法與論文寫作
## 4266     17315            632                     進階科學研究計畫管理
## 4267     44191            633                                 博士論文
## 4268     32136            633                                 專題討論
## 4269     56495            633                                 碩士論文
## 4270     25416            633                                 專題討論
## 4271     63597            633                                 果樹病害
## 4272     41228            633                           植物病害與診斷
## 4273     29765            633                       微生物農藥化學特論
## 4274     58708            633                           分子植物病理學
## 4275     82762            633                               分子生物學
## 4276     31994            633                             非傳染性病害
## 4277     27614            633                               書報討論下
## 4278     31262            633                           植物健康管理下
## 4279     18484            633                       植物健康管理實習下
## 4280     16076            633                       病毒基因工程學特論
## 4281     74654            633                               細胞生物學
## 4282     28099            633                           森林病理學概論
## 4283     52895            641                               食品與健康
## 4284     83299            641                                 博士論文
## 4285     55158            641                                 專題討論
## 4286     15655            641                                 專題討論
## 4287     89544            641                           機能性食品特論
## 4288     40891            641                             食品多醣特論
## 4289     41910            641                                 碩士論文
## 4290     20921            641                                 專題討論
## 4291     43780            641                                 專題討論
## 4292     16466            641                           食品生物技術學
## 4293     75362            641            分子營養學:基因體、代謝與健康
## 4294     78953            641                               穀類加工學
## 4295     36710            641                             食品分離技術
## 4296     38274            641                   食品細胞分子生物方法學
## 4297     17378            641                             澱粉論文導讀
## 4298     15819            641                           微生物醱酵工程
## 4299     89239            641                         臨床營養與食療學
## 4300     32164            641                               食品添加物
## 4301     71426            641                               食品毒理學
## 4302     67376            641                     食療藥膳學原理與應用
## 4303     60445            641                             食品化學分析
## 4304     53262            641                             食品工廠管理
## 4305     82273            641                               食品包裝學
## 4306     52033            642                                 博士論文
## 4307     88507            642                       植物生物技術學特論
## 4308     61037            642                             微生物學特論
## 4309     28566            642                                 專題研究
## 4310     36707            642                                 專題研究
## 4311     17765            642                                 專題研究
## 4312     71787            642                                 專題研究
## 4313     33279            642                                 專題研究
## 4314     78811            642                                 專題研究
## 4315     84540            642                                 專題研究
## 4316     52647            642                                 專題研究
## 4317     34622            642                                 專題研究
## 4318     70979            642                                 專題討論
## 4319     80567            642                                 專題討論
## 4320     64988            642                                 專題討論
## 4321     56861            642                                 專題討論
## 4322     37500            642                                 專題討論
## 4323     78560            642                                 專題討論
## 4324     68013            642                                 專題討論
## 4325     58002            642                                 專題討論
## 4326     48201            642                                 專題討論
## 4327     86851            642                     微生物與環境議題特論
## 4328     10098            642                     高等生物科技特論(二)
## 4329     77922            642                     高等生物科技特論(二)
## 4330     81691            642                     高等生物科技特論(二)
## 4331     33259            642                                 碩士論文
## 4332     29782            642                                 再生醫學
## 4333     52752            642                 植物病毒學與生物技術新知
## 4334     48402            642                       生物科技進階實務 2
## 4335     64995            642           應用暨食品微生物論文研究與寫作
## 4336     34048            642                   生物科技管理與產業分析
## 4337     51517            642                         表觀基因體學特論
## 4338     84965            642                                 專題討論
## 4339     67666            642                                 專題討論
## 4340     31358            642                   生物晶片操作與資料分析
## 4341     15061            643                                 碩士論文
## 4342     58922            643                               專題研究二
## 4343     69274            643                               專題研究二
## 4344     68726            643                               專題研究二
## 4345     81247            643                               專題研究二
## 4346     52346            643                               專題研究二
## 4347     72878            643                               專題研究四
## 4348     52731            643                               專題研究四
## 4349     17140            643                               專題研究四
## 4350     75603            643                               專題研究四
## 4351     69457            643                               專題研究四
## 4352     83293            643                               專題討論二
## 4353     44570            643                               專題討論四
## 4354     34119            643                       伴侶動物診療實習二
## 4355     22678            643                       伴侶動物診療實習四
## 4356     38464            643                 大動物及野生動物組診療二
## 4357     19446            643                 大動物及野生動物組診療四
## 4358     34686            643                 小動物急診加護專題討論二
## 4359     51894            643                 小動物急診加護專題討論四
## 4360     45378            643                 脊髓及周邊神經學專題研討
## 4361     77719            644                                 碩士論文
## 4362     39566            644                               專題討論二
## 4363     27225            644                               專題討論四
## 4364     18139            644                               專題研究二
## 4365     87910            644                               專題研究二
## 4366     80221            644                               專題研究二
## 4367     59046            644                               專題研究二
## 4368     56992            644                               專題研究四
## 4369     23636            644                               專題研究四
## 4370     72321            644                               專題研究四
## 4371     13863            644                               專題研究四
## 4372     57946            644                         組織病理診斷學二
## 4373     24793            644                         組織病理診斷學四
## 4374     41000            644                         獸醫診斷病理學二
## 4375     17838            644                         獸醫診斷病理學四
## 4376     60069            644                             實驗動物醫學
## 4377     31968            645                                 碩士論文
## 4378     53449            645                               專題討論二
## 4379     42943            645                               專題討論四
## 4380     46202            645                           植物病因診斷學
## 4381     40406            645                               應用農藥學
## 4382     13023            645                               植醫實習二
## 4383     62131            645                               植醫實習四
## 4384     59378            645                               植醫實習四
## 4385     39504            645                       植物健康整合管理下
## 4386     69226            645                   植物健康整合管理實習下
## 4387     11621            645                             樹木健康管理
## 4388     49632            645                             農業昆蟲鑑定
## 4389     40755            701                             管理科學模式
## 4390     33448            701                               統計學一下
## 4391     60332            701                               統計學一下
## 4392     61175            701                                 程式設計
## 4393     55640            701                                 企業管理
## 4394     54666            701                                 企業管理
## 4395     22782            701                                 作業管理
## 4396     11201            701                                 作業管理
## 4397     34041            701                                   商事法
## 4398     83642            701                               消費者行為
## 4399     18245            701                               供應鏈管理
## 4400     25167            701                             智慧財產權法
## 4401     36630            701                                 資訊管理
## 4402     17473            702                             會計學甲一下
## 4403     10720            702                             會計學甲一下
## 4404     65371            702                             會計學甲一下
## 4405     38239            702                             會計學甲一下
## 4406     43573            702                             會計學甲一下
## 4407     35827            702                             會計學甲一下
## 4408     77236            702                             會計學甲一下
## 4409     25814            702                               會計學一下
## 4410     63401            702                             會計學原理下
## 4411     30266            702                             會計學原理下
## 4412     38009            702                             商業應用軟體
## 4413     58764            702                               統計學一下
## 4414     27581            702                               統計學一下
## 4415     22310            702                             中級會計專題
## 4416     49516            702                             中級會計學下
## 4417     23153            702                             中級會計學下
## 4418     51486            702                             中級會計學下
## 4419     20937            702                             中級會計學下
## 4420     59239            702                                   商事法
## 4421     38636            702                             高等會計學下
## 4422     47957            702                             高等會計學下
## 4423     30691            702                       成本與管理會計甲下
## 4424     51690            702                       成本與管理會計甲下
## 4425     57124            702                       成本與管理會計甲下
## 4426     62406            702                             會計資訊系統
## 4427     85983            702                                 審計學下
## 4428     70405            702                                 審計學下
## 4429     25989            702                                 審計學下
## 4430     66685            702                                 政府會計
## 4431     77637            703                               統計學一下
## 4432     20784            703                               統計學一下
## 4433     50815            703                             中級會計學下
## 4434     74315            703                             中級會計學下
## 4435     72049            703                                   投資學
## 4436     64576            703                                   投資學
## 4437     56486            703                                   投資學
## 4438     64980            703                                   投資學
## 4439     74268            703                                   投資學
## 4440     56178            703                                   商事法
## 4441     10625            703                                 財務管理
## 4442     81955            703                                 財務管理
## 4443     36314            703                                 財務管理
## 4444     35521            703                                 財務管理
## 4445     41329            703                                 財務管理
## 4446     38421            703                                 財務管理
## 4447     61803            703                             投資銀行管理
## 4448     55698            703                             財務報告分析
## 4449     14207            703                             財務報告分析
## 4450     21774            703                               總體經濟學
## 4451     11438            703                               高等統計下
## 4452     42670            703                             金融機構管理
## 4453     10464            703                             金融機構管理
## 4454     79318            703                               新金融商品
## 4455     40210            703                                 行為財務
## 4456     41358            704                             會計學甲一下
## 4457     51126            704                             會計學甲一下
## 4458     24164            704                               統計學一下
## 4459     32569            704                               統計學一下
## 4460     19634            704                                 行銷管理
## 4461     74667            704                                 行銷管理
## 4462     69185            704                                   商事法
## 4463     14112            704                                   商事法
## 4464     45854            704                             國際財務管理
## 4465     27283            704                             國際財務管理
## 4466     13746            704                         國際企業經營策略
## 4467     33525            704                         國際企業經營策略
## 4468     33937            705                                 程式設計
## 4469     50899            705                                 離散數學
## 4470     76110            705                                 作業系統
## 4471     67790            705                               統計學一下
## 4472     82136            705                             資訊管理導論
## 4473     82222            705                                   演算法
## 4474     45890            705                                 組織行為
## 4475     80936            705                                 計算理論
## 4476     16527            705                           系統分析與設計
## 4477     84424            705                               資管專題一
## 4478     24317            705                               資管專題一
## 4479     66251            705                               資管專題一
## 4480     87620            705                               資管專題一
## 4481     33628            705                               資管專題一
## 4482     16108            705                               資管專題一
## 4483     40497            705                               資管專題一
## 4484     70103            705                               資管專題一
## 4485     79148            705                               資管專題一
## 4486     50727            705                               資管專題一
## 4487     95044            705                               資管專題二
## 4488     43878            705                                 作業研究
## 4489     20228            705                                 行銷管理
## 4490     66148            722                                 博士論文
## 4491     50695            722                           會計實證研究二
## 4492     79438            722                     會計學專題研究討論二
## 4493     14108            722                     會計學專題研究討論四
## 4494     60546            722                                 碩士論文
## 4495     83569            722                     會計實證研究方法介紹
## 4496     75768            722                         會計資訊系統研討
## 4497     20642            722                             企業併購實務
## 4498     20038            722                       財報分析與企業評價
## 4499     46624            722                         財務會計準則研討
## 4500     20761            722                               高等審計學
## 4501     11765            722           國內外資本市場募集與會計師實務
## 4502     80584            722                             大陸稅法研討
## 4503     10103            722                             會計專業倫理
## 4504     64298            723                                 博士論文
## 4505     11624            723                         財金學術英文寫作
## 4506     15093            723                             財務金融研討
## 4507     70292            723                             財務實証研討
## 4508     14430            723                               公司理財一
## 4509     73209            723                             計量經濟學二
## 4510     15898            723                                 碩士論文
## 4511     69355            723                   財金獨立研究與論文寫作
## 4512     81217            723                   財金獨立研究與論文寫作
## 4513     44493            723                   財金獨立研究與論文寫作
## 4514     26701            723                                 財務理論
## 4515     41813            723                 結構型財務與信用衍生商品
## 4516     60913            723                 風險管理與保險專題研討一
## 4517     84471            723                         公司理財專題研討
## 4518     59417            723                                 計量分析
## 4519     68478            723                             時間序列分析
## 4520     30640            723                               財務演算法
## 4521     59063            723                             數量財務專題
## 4522     76939            723                             連續時間財務
## 4523     84787            723                         金控經營管理實務
## 4524     67913            723                                 保險法規
## 4525     81283            723                                 風險管理
## 4526     84588            723                           稅務爭訟專題二
## 4527     21972            723                             民商法專題二
## 4528     39586            724                                 博士論文
## 4529     87218            724                             國際金融市場
## 4530     10492            724                       投資管理專題研究二
## 4531     13810            724                         國際進入策略研討
## 4532     26769            724                           行銷管理研討一
## 4533     13290            724                               產業經濟學
## 4534     73619            724                         國際企業管理研討
## 4535     39767            724                   組織理論與策略決策研討
## 4536     81235            724                   策略研究之前瞻議題研討
## 4537     52466            724                                 碩士論文
## 4538     21125            724                               國際經濟學
## 4539     74123            724                         國際企業經營策略
## 4540     16149            724                             國際金融投資
## 4541     38645            724                             隨機定價模型
## 4542     12308            724                               財務工程二
## 4543     95043            724                               總體經濟學
## 4544     47305            724                             大陸經濟發展
## 4545     85566            724                                 金融計算
## 4546     72507            724                             選擇權與期貨
## 4547     78236            724                       國際併購與重組管理
## 4548     24355            724               國際企業稅務規劃與移轉訂價
## 4549     77068            724                     國際競爭力與台灣企業
## 4550     80218            724                                 企業倫理
## 4551     28657            724                       知識經濟與人力分析
## 4552     77410            725                                 博士論文
## 4553     55313            725                             高等資訊管理
## 4554     83551            725                           資管博士論壇二
## 4555     67725            725                               網路最佳化
## 4556     30358            725                                 碩士論文
## 4557     60888            725                       資訊科技與競爭策略
## 4558     50754            725                       供給鍊管理論文研討
## 4559     80833            725                     網路資訊行為論文研討
## 4560     23761            725                           資料庫論文研討
## 4561     77885            725                     資訊服務管理論文研討
## 4562     68416            725                     行動網際網路論文研討
## 4563     26347            725                       電腦圖學論文研討二
## 4564     68518            725                       服務科學論文研討二
## 4565     67269            725                       資料探勘論文研討二
## 4566     40790            725                           企管顧問實務二
## 4567     40763            725                                 資料探勘
## 4568     55407            725                           雲端技術與應用
## 4569     82500            725                           資管專題討論二
## 4570     57986            725                             資管專題討論
## 4571     69950            725                                 知識管理
## 4572     53281            725                     資訊法與資訊政策專題
## 4573     15243            741                                 博士論文
## 4574     38802            741                                   方法論
## 4575     59481            741                             行銷決策模式
## 4576     77627            741                       技術分析與創新研討
## 4577     32758            741                                 碩士論文
## 4578     83438            741                                 管理會計
## 4579     41091            741                                 組織行為
## 4580     30567            741                                 組織行為
## 4581     85473            741                     消費者態度及心理研討
## 4582     77851            741                         供應鏈與系統整合
## 4583     21853            741                   電子化企業與供應鏈管理
## 4584     75815            741                         賽局、資訊與策略
## 4585     74274            741                 員工與組織環境互動論研討
## 4586     18987            741                             管理科學模式
## 4587     95041            741                       產業技術及市場前瞻
## 4588     36688            741                             產業競爭分析
## 4589     63925            741                             行銷通路管理
## 4590     86290            741                             高等統計學二
## 4591     36317            741                               多變量分析
## 4592     49463            741                           創新與創業管理
## 4593     41304            741                           非營利組織管理
## 4594     77854            741                                 專案管理
## 4595     13358            741                               服務業管理
## 4596     67275            741                           科技創新與行銷
## 4597     39764            741                       知識管理與服務創新
## 4598     59498            741                                 推廣策略
## 4599     76387            741                                 薪酬管理
## 4600     60588            741                         賽局、訊息與交易
## 4601     13494            749                                 碩士論文
## 4602     25138            749                               行銷管理學
## 4603     29257            749                               管理會計學
## 4604     37144            749                                 組織行為
## 4605     68176            749                                 財務管理
## 4606     58049            749                               創業與創新
## 4607     16895            749                       全球顧問實習(二)
## 4608     35131            749                           科技與創新管理
## 4609     27163            749                       公益創業及社會企業
## 4610     66404            749                             財務報表分析
## 4611     22755            749                                 策略管理
## 4612     27492            801                             生物統計學一
## 4613     43099            801                       生物統計與流行病學
## 4614     43295            801                       健康促進與衛生教育
## 4615     78530            801                                 品質概論
## 4616     86858            801                                 流行病學
## 4617     15155            801                           慢性病流行病學
## 4618     79537            801                       社會安全與衛生福利
## 4619     24667            801                           醫事及衛生法規
## 4620     12337            801                                 婦幼衛生
## 4621     16704            801                             臨床醫學概要
## 4622     86135            801                     環境與職業毒理學概論
## 4623     73119            801                             環境衛生要論
## 4624     77375            801                                 職業衛生
## 4625     26782            801                         醫事服務機構管理
## 4626     39933            801                         公共衛生專題研究
## 4627     67234            801                         公共衛生專題研究
## 4628     46669            801                         公共衛生專題研究
## 4629     21416            801                         公共衛生專題研究
## 4630     15602            801                         公共衛生專題研究
## 4631     77564            801                             公共衛生實務
## 4632     23324            801                         健康行為科學導論
## 4633     29514            841                                 博士論文
## 4634     25815            841                           生殖毒理學特論
## 4635     11585            841                 環境與職業衛生專題討論一
## 4636     14511            841                 環境與職業衛生專題討論二
## 4637     18598            841                                 碩士論文
## 4638     86621            841                           氣膠專題討論下
## 4639     64010            841                       生殖危害專題討論下
## 4640     71800            841                             氣膠儀器分析
## 4641     47079            841                     環境職業醫學專題討論
## 4642     75803            841                   環境與兒童健康書報討論
## 4643     67136            841                           呼吸毒理學概論
## 4644     13675            841                 環境與職業衛生個案討論一
## 4645     56810            841                 環境與職業衛生個案討論二
## 4646     59810            841                 環境與職業醫學專題討論二
## 4647     44389            841                     環境與健康書報討論下
## 4648     53047            841                       環境及職業流行病學
## 4649     38706            841                         環境與職業毒理學
## 4650     89399            841                             個人防護設備
## 4651     72139            841                                 暴露評估
## 4652     37896            841                                 人因工程
## 4653     76409            841                   健康與疾病發展起源(下)
## 4654     24154            841                       環境職業衛生特論二
## 4655     51596            841                           作業環境測定二
## 4656     68909            841                         健康風險評估實務
## 4657     80736            841                            衛生管理實務I
## 4658     47483            841                           風險管理與溝通
## 4659     40033            841                             學術英文寫作
## 4660     48995            841                         當代全球衛生議題
## 4661     62416            841                           環境及職業健康
## 4662     47463            844                                 博士論文
## 4663     42682            844                         環境衛生專題討論
## 4664     78683            844                       環境職業衛生特論二
## 4665     53242            844                                 碩士論文
## 4666     37046            844                             環境衛生政策
## 4667     28381            844                           環境微生物專論
## 4668     87682            844                       環境衛生專題討論三
## 4669     41704            844                         毒理基因體學特論
## 4670     45563            844                         環境基因與表基因
## 4671     13646            844                               醫學昆蟲學
## 4672     39910            844                                 水質管理
## 4673     65997            844                       環境變遷與公共衛生
## 4674     73039            844                                 生物偵測
## 4675     81564            844                             毒理基因體學
## 4676     71984            844                     環境衛生與蟲媒傳染病
## 4677     18393            847                                 碩士論文
## 4678     49171            847                           公共衛生研究法
## 4679     23084            847                             醫療資訊概論
## 4680     45984            847                     廣義線性模式應用分析
## 4681     46572            847                         衛生統計實務解析
## 4682     61283            848                                 博士論文
## 4683     21711            848                 健康政策與管理專題討論一
## 4684     67227            848                   健康政策與管理獨立研究
## 4685     74657            848                   健康政策與管理獨立研究
## 4686     86067            848                   健康政策與管理獨立研究
## 4687     27722            848                   健康政策與管理獨立研究
## 4688     71934            848                   健康政策與管理獨立研究
## 4689     88948            848                   健康政策與管理獨立研究
## 4690     17073            848                   健康政策與管理獨立研究
## 4691     24982            848                   健康政策與管理獨立研究
## 4692     24840            848                   健康政策與管理獨立研究
## 4693     65231            848                   健康政策與管理獨立研究
## 4694     18492            848                   健康政策與管理獨立研究
## 4695     86024            848                   健康政策與管理獨立研究
## 4696     66120            848                   健康政策與管理獨立研究
## 4697     81913            848                                 碩士論文
## 4698     84376            848                       健康服務與產業綜論
## 4699     12282            848                 社會流行病學:原理與方法
## 4700     22865            848                         健康政策當代議題
## 4701     88241            848               健康照護機構品質管理與創新
## 4702     57520            848                   醫療機構成本系統與管理
## 4703     24450            848                     比較醫療機構管理制度
## 4704     82178            848                       健康產業與政策發展
## 4705     69978            848                               醫療與法律
## 4706     18639            848                       醫療機構問題與決策
## 4707     45355            848                         長期照護體系概論
## 4708     21195            848                       醫院資訊系統與管理
## 4709     41264            848               健康照護組織領導原則與實務
## 4710     72673            848                       健康組織行銷與策略
## 4711     83730            848                             基礎英文寫作
## 4712     59178            848                               醫療行銷學
## 4713     50176            849                                 博士論文
## 4714     41341            849                       流行病學實例研究一
## 4715     55025            849                       流行病學實例研究二
## 4716     15031            849                         流行病學議題回顧
## 4717     69476            849                   生物醫學統計專題討論D2
## 4718     83997            849                   高等預防醫學專題討論二
## 4719     11500            849                   高等預防醫學專題討論四
## 4720     19478            849                           應用隨機過程二
## 4721     60783            849                     健康研究法原理及應用
## 4722     49609            849                                 碩士論文
## 4723     39247            849                         流行病學實例研究
## 4724     12912            849                             流行病學特論
## 4725     67043            849                   生物醫學統計諮詢實務M3
## 4726     59604            849                   生物醫學統計專題討論M2
## 4727     12491            849                         預防醫學研究方法
## 4728     71496            849                       高等預防醫學理論二
## 4729     41646            849                         預防醫學實務討論
## 4730     81758            849                         預防醫學文獻批判
## 4731     85388            849                         預防醫學論文寫作
## 4732     47949            849                             癌症流行病學
## 4733     22695            849                   新興傳染病的流行與防治
## 4734     95007            849                       質性研究與疾病預防
## 4735     57082            849                                 專題研究
## 4736     43954            849                                 專題研究
## 4737     21562            849                                 專題研究
## 4738     13726            849                                 專題研究
## 4739     82153            849                             藥物流行病學
## 4740     19797            849                   緊急救護與災害應變系統
## 4741     38461            849                                 臨床試驗
## 4742     18905            849                       高等生物統計學方法
## 4743     40279            849                             疾病篩檢統計
## 4744     75836            849                             結構方程模式
## 4745     41301            849                       老化及老人流行病學
## 4746     44635            849                             生物統計學一
## 4747     79675            849                             臨床流行病學
## 4748     59145            849                     通報傳染病之檢驗實務
## 4749     31514            849                   傳染病流行病學數理模式
## 4750     62705            849                             學術英文寫作
## 4751     34001            849                       生物統計與流行病學
## 4752     31978            849                         重複測量統計分析
## 4753     57190            901                        工程數學-線性代數
## 4754     46621            901                        工程數學-線性代數
## 4755     17187            901                        工程數學-線性代數
## 4756     15165            901                            工程數學-複變
## 4757     16484            901                            工程數學-複變
## 4758     44724            901                   電工實驗(網路與多媒體)
## 4759     33986            901                               計算機概論
## 4760     73857            901                               計算機概論
## 4761     28549            901                               計算機概論
## 4762     14178            901                               計算機概論
## 4763     45838            901                               計算機概論
## 4764     66674            901                           電子電路實驗二
## 4765     29303            901                               機率與統計
## 4766     46785            901                               機率與統計
## 4767     53252            901                               機率與統計
## 4768     45265            901                               機率與統計
## 4769     47788            901                                 離散數學
## 4770     75274            901                                 離散數學
## 4771     57457            901                             電力電子概論
## 4772     47443            901                                 電磁學一
## 4773     51801            901                                 電磁學一
## 4774     20518            901                                 電磁學一
## 4775     55113            901                                 電磁學一
## 4776     12340            901                         數位信號處理概論
## 4777     61248            901                             數位通信系統
## 4778     40582            901                         電工實驗(電磁波)
## 4779     42230            901                       電工實驗(電力電子)
## 4780     24574            901                         類比積體電路設計
## 4781     79472            901                                 通信原理
## 4782     71079            901                             微波系統導論
## 4783     25526            901                             電腦網路導論
## 4784     77978            901                               信號與系統
## 4785     12057            901                               信號與系統
## 4786     82330            901                               信號與系統
## 4787     73467            901                             生醫工程概論
## 4788     10518            901                             電力工程導論
## 4789     84977            901                       資料結構與程式設計
## 4790     16066            901                                 數值方法
## 4791     18794            901                               應用電學二
## 4792     52527            901                       電子設計自動化導論
## 4793     89782            901                         無線行動網路導論
## 4794     20347            901                                 電子學二
## 4795     44894            901                                 電子學二
## 4796     16020            901                                 電子學二
## 4797     40986            901                                 電子學二
## 4798     79618            901                               半導體工程
## 4799     56346            901                               固態電子學
## 4800     84098            901                                 光電導論
## 4801     16126            901                                 近代物理
## 4802     35200            901                                   演算法
## 4803     31351            901                       電工實驗(數位電路)
## 4804     26180            901                         電工實驗(半導體)
## 4805     84893            901                       電工實驗(通信專題)
## 4806     27569            901                       電工實驗(自動控制)
## 4807     69213            901                             無線電路設計
## 4808     23005            901                             積體電路設計
## 4809     21890            901                     電工實驗(嵌入式系統)
## 4810     17713            901                       電工實驗(生醫工程)
## 4811     57015            901                           電工實驗(光電)
## 4812     26163            901                         數位語音處理概論
## 4813     23492            901                                 控制系統
## 4814     14858            901                               計算機結構
## 4815     33714            901                             奈米電子導論
## 4816     74052            901                                 專題研究
## 4817     54495            901                                 專題研究
## 4818     67907            901                                 專題研究
## 4819     66014            901                                 專題研究
## 4820     87295            901                                 專題研究
## 4821     79508            901                                 專題研究
## 4822     31501            901                                 專題研究
## 4823     88302            901                                 專題研究
## 4824     45559            901                                 專題研究
## 4825     10910            901                                 專題研究
## 4826     50731            901                                 專題研究
## 4827     65238            901                                 專題研究
## 4828     89313            901                                 專題研究
## 4829     79858            901                                 專題研究
## 4830     50222            901                                 專題研究
## 4831     19723            901                                 專題研究
## 4832     70344            901                                 專題研究
## 4833     38180            901                                 專題研究
## 4834     81759            901                                 專題研究
## 4835     18872            901                                 專題研究
## 4836     81647            901                                 專題研究
## 4837     67161            901                                 專題研究
## 4838     71938            901                                 專題研究
## 4839     31954            901                                 專題研究
## 4840     85998            901                                 專題研究
## 4841     68498            901                                 專題研究
## 4842     13092            901                                 專題研究
## 4843     76550            901                                 專題研究
## 4844     32452            901                                 專題研究
## 4845     66733            901                                 專題研究
## 4846     76852            901                                 專題研究
## 4847     59747            901                                 專題研究
## 4848     87304            901                                 專題研究
## 4849     87051            901                                 專題研究
## 4850     73623            901                                 專題研究
## 4851     36770            901                                 專題研究
## 4852     56210            901                                 專題研究
## 4853     26726            901                                 專題研究
## 4854     10565            901                                 專題研究
## 4855     76048            901                                 專題研究
## 4856     22471            901                                 專題研究
## 4857     87299            901                                 專題研究
## 4858     71874            901                                 專題研究
## 4859     25948            901                                 專題研究
## 4860     23796            901                                 專題研究
## 4861     64627            901                                 專題研究
## 4862     75687            901                                 專題研究
## 4863     83135            901                                 專題研究
## 4864     29202            901                                 專題研究
## 4865     83447            901                                 專題研究
## 4866     29927            901                                 專題研究
## 4867     64481            901                                 專題研究
## 4868     47927            901                                 專題研究
## 4869     13576            901                                 專題研究
## 4870     86413            901                                 專題研究
## 4871     13826            901                                 專題研究
## 4872     83851            901                                 專題研究
## 4873     18780            901                                 專題研究
## 4874     83144            901                                 專題研究
## 4875     30785            901                                 專題研究
## 4876     45679            901                                 專題研究
## 4877     41095            901                                 專題研究
## 4878     15117            901                                 專題研究
## 4879     10353            901                                 專題研究
## 4880     57391            901                                 專題研究
## 4881     77611            901                                 專題研究
## 4882     31663            901                                 專題研究
## 4883     13337            901                                 專題研究
## 4884     67600            901                                 專題研究
## 4885     78867            901                                 專題研究
## 4886     83815            901                                 專題研究
## 4887     42708            901                                 專題研究
## 4888     78118            901                                 專題研究
## 4889     20073            901                                 專題研究
## 4890     19134            901                                 專題研究
## 4891     42524            901                                 專題研究
## 4892     42679            901                                 專題研究
## 4893     12961            901                                 專題研究
## 4894     19771            901                                 專題研究
## 4895     50390            901                                 專題研究
## 4896     19652            901                                 專題研究
## 4897     80344            901                                 專題研究
## 4898     82225            901                                 專題研究
## 4899     34671            901                                 專題研究
## 4900     56744            901                                 專題研究
## 4901     44537            901                                 專題研究
## 4902     27139            901                                 專題研究
## 4903     14244            901                                 專題研究
## 4904     53572            901                                 專題研究
## 4905     16426            901                                 專題研究
## 4906     48714            901                                 專題研究
## 4907     39813            901                                 專題研究
## 4908     34297            901                                 專題研究
## 4909     83510            901                                 專題研究
## 4910     65871            901                                 專題研究
## 4911     27220            901                                 專題研究
## 4912     22225            901                                 專題研究
## 4913     80897            901                                 專題研究
## 4914     33763            901                                 專題研究
## 4915     58356            901                                 專題研究
## 4916     20737            901                                 專題研究
## 4917     82417            901                                 專題研究
## 4918     32217            901                                 專題研究
## 4919     36557            901                                 專題研究
## 4920     72312            901                                 專題研究
## 4921     65012            901                                 專題研究
## 4922     19791            901                                 專題研究
## 4923     50590            901                                 專題研究
## 4924     18403            901                                 專題研究
## 4925     61453            901                                 專題研究
## 4926     27137            901                                 專題研究
## 4927     26184            901                                 專題研究
## 4928     20227            901                                 專題研究
## 4929     62719            901                                 專題研究
## 4930     59149            901                                 專題研究
## 4931     77818            901                         平面顯示技術通論
## 4932     23407            901                           計算機程式設計
## 4933     54236            902                         資料結構與演算法
## 4934     36588            902                         資料結構與演算法
## 4935     16711            902                           數位系統與實驗
## 4936     65361            902                           數位系統與實驗
## 4937     65698            902                                 離散數學
## 4938     42235            902                                 離散數學
## 4939     60470            902                                     機率
## 4940     47323            902                                     機率
## 4941     59456            902                                 作業系統
## 4942     68351            902                                 作業系統
## 4943     69461            902                                 專題研究
## 4944     31524            902                                 專題研究
## 4945     41987            902                                 專題研究
## 4946     16708            902                                 專題研究
## 4947     25586            902                                 專題研究
## 4948     10307            902                                 專題研究
## 4949     29777            902                                 專題研究
## 4950     17878            902                                 專題研究
## 4951     86263            902                                 專題研究
## 4952     74959            902                                 專題研究
## 4953     60764            902                                 專題研究
## 4954     27677            902                                 專題研究
## 4955     33639            902                                 專題研究
## 4956     18764            902                                 專題研究
## 4957     11460            902                                 專題研究
## 4958     60017            902                                 專題研究
## 4959     13120            902                                 專題研究
## 4960     67154            902                                 專題研究
## 4961     41108            902                                 專題研究
## 4962     27582            902                                 專題研究
## 4963     74091            902                                 專題研究
## 4964     83702            902                                 專題研究
## 4965     75129            902                                 專題研究
## 4966     14094            902                                 專題研究
## 4967     25508            902                                 專題研究
## 4968     46739            902                                 專題研究
## 4969     88395            902                                 專題研究
## 4970     17649            902                                 專題研究
## 4971     88806            902                                 專題研究
## 4972     23464            902                                 專題研究
## 4973     68694            902                                 專題研究
## 4974     50521            902                                 專題研究
## 4975     30247            902                                 專題研究
## 4976     63662            902                                 專題研究
## 4977     80289            902                                 專題研究
## 4978     52978            902                                 專題研究
## 4979     83399            902                                 專題研究
## 4980     49257            902                                 專題研究
## 4981     68899            902                                 專題研究
## 4982     57559            902                                 專題研究
## 4983     48333            902                           計算機網路實驗
## 4984     24264            902                           前瞻資訊科技二
## 4985     44932            902                               計算機概論
## 4986     24598            902                       現代科學與心靈科學
## 4987     12899            921                                 博士論文
## 4988     16440            921                                 專題討論
## 4989     39487            921                                 專題討論
## 4990     57437            921                                 專題討論
## 4991     82120            921                                 碩士論文
## 4992     24083            921                                 專題討論
## 4993     62352            921                                 專題討論
## 4994     71726            921                                 專題討論
## 4995     88270            921                         氧化層穩定度專題
## 4996     76358            921                             適應控制系統
## 4997     62635            921                   基因晶片方法與數據分析
## 4998     38909            921                   智慧終端裝置與雲端計算
## 4999     89174            921                     多元化金氧半積電技術
## 5000     33945            921                         微波電路專題實驗
## 5001     95008            921                           電力電子學專題
## 5002     75654            921                             半導體元件一
## 5003     13326            921                         通訊積體電路設計
## 5004     58460            921                         高等數位訊號處理
## 5005     88161            921                     電腦輔助分析與最佳化
## 5006     85665            921                               非線性光學
## 5007     85153            921                                 最佳控制
## 5008     31165            921                     高速介面積體電路設計
## 5009     83775            921                               計算機模擬
## 5010     89305            921                             醫學影像特論
## 5011     38034            921                     先進機器人感測與控制
## 5012     32878            921                         計算認知神經科學
## 5013     22109            921                     電力系統控制與穩定度
## 5014     16006            921                           半導體元件物理
## 5015     63579            921                             積體電路工程
## 5016     18559            921                           光電半導體技術
## 5017     51226            921                         生醫分子影像導論
## 5018     87242            921                                 系統識別
## 5019     22723            921                 車用疊加層網路之普及運算
## 5020     54649            921                               光電電磁學
## 5021     64653            921                                 軟體工程
## 5022     26130            921                         高等積體電路設計
## 5023     20277            921                                 生物物理
## 5024     14289            922                                 博士論文
## 5025     28942            922                                 專題討論
## 5026     10708            922                                 專題研究
## 5027     38096            922                                 專題研究
## 5028     54891            922                                 專題研究
## 5029     82986            922                                 專題研究
## 5030     78761            922                                 專題研究
## 5031     25628            922                                 專題研究
## 5032     85535            922                                 專題研究
## 5033     24581            922                                 專題研究
## 5034     89296            922                                 專題研究
## 5035     79474            922                                 專題研究
## 5036     66528            922                                 專題研究
## 5037     26561            922                                 專題研究
## 5038     53269            922                                 專題研究
## 5039     69058            922                                 專題研究
## 5040     80347            922                                 專題研究
## 5041     86743            922                                 專題研究
## 5042     64525            922                                 專題研究
## 5043     33543            922                                 專題研究
## 5044     69914            922                                 專題研究
## 5045     69195            922                                 專題研究
## 5046     45215            922                                 專題研究
## 5047     77210            922                                 專題研究
## 5048     29685            922                                 專題研究
## 5049     87190            922                                 專題研究
## 5050     32716            922                                 專題研究
## 5051     47345            922                                 專題研究
## 5052     39369            922                                 專題研究
## 5053     30911            922                                 專題研究
## 5054     22667            922                                 專題研究
## 5055     31240            922                                 專題研究
## 5056     23500            922                                 專題研究
## 5057     42705            922                                 專題研究
## 5058     36386            922                                 專題研究
## 5059     14552            922                                 專題研究
## 5060     79414            922                                 專題研究
## 5061     76576            922                                 專題研究
## 5062     53816            922                                 專題研究
## 5063     17733            922                                 專題研究
## 5064     25473            922                                 專題研究
## 5065     64041            922                                 專題研究
## 5066     50812            922                                 碩士論文
## 5067     47938            922                                 專題研究
## 5068     65660            922                                 專題研究
## 5069     34414            922                                 專題研究
## 5070     15209            922                                 專題研究
## 5071     39120            922                                 專題研究
## 5072     43839            922                                 專題研究
## 5073     19417            922                                 專題研究
## 5074     71951            922                                 專題研究
## 5075     88044            922                                 專題研究
## 5076     74840            922                                 專題研究
## 5077     10674            922                                 專題研究
## 5078     30590            922                                 專題研究
## 5079     87912            922                                 專題研究
## 5080     38164            922                                 專題研究
## 5081     25859            922                                 專題研究
## 5082     34756            922                                 專題研究
## 5083     12153            922                                 專題研究
## 5084     46170            922                                 專題研究
## 5085     67738            922                                 專題研究
## 5086     15125            922                                 專題研究
## 5087     35966            922                                 專題研究
## 5088     19633            922                                 專題研究
## 5089     62208            922                                 專題研究
## 5090     26312            922                                 專題研究
## 5091     53826            922                                 專題研究
## 5092     48084            922                                 專題研究
## 5093     39137            922                                 專題研究
## 5094     46603            922                                 專題研究
## 5095     17277            922                                 專題研究
## 5096     49283            922                                 專題研究
## 5097     73650            922                                 專題研究
## 5098     10265            922                                 專題研究
## 5099     35526            922                                 專題研究
## 5100     12922            922                                 專題研究
## 5101     80519            922                                 專題研究
## 5102     37299            922                                 專題研究
## 5103     16253            922                                 專題研究
## 5104     29042            922                                 專題研究
## 5105     52501            922                                 專題研究
## 5106     81891            922                                 專題研究
## 5107     24147            922                                 專題研究
## 5108     16775            922                                 專題研究
## 5109     16442            922                                 專題研究
## 5110     81107            922                                 專題討論
## 5111     66633            922                                 專題討論
## 5112     25035            922                             高等作業系統
## 5113     87703            922                                   腦理論
## 5114     34835            922                             系統效能評估
## 5115     71114            922                               財務演算法
## 5116     22033            922                                 數值方法
## 5117     71356            922                             自然語言處理
## 5118     14236            922                             軟體工程設計
## 5119     73253            922                       資訊理論與編碼技巧
## 5120     37277            922                           高等編譯器設計
## 5121     72475            922                           高等計算機網路
## 5122     87831            922                           高等計算機結構
## 5123     75132            922                             平行程式設計
## 5124     56326            922                           多媒體資訊系統
## 5125     68299            922                                 虛擬實境
## 5126     40722            922                             圖形分析辨認
## 5127     39480            922                             醫療資訊系統
## 5128     18541            922                             數位視覺效果
## 5129     68662            922                 行動通訊服務系統效能評估
## 5130     68754            922                                 遊戲設計
## 5131     88408            922                       網路資訊檢索與探勘
## 5132     65793            922                   科技英文寫作與研究方法
## 5133     58331            922                         數位語音處理概論
## 5134     12997            922                       嵌入式作業系統實作
## 5135     73654            922                         高等人機互動介面
## 5136     86306            922                           次世代無線網路
## 5137     63010            922                       圖形處理器程式設計
## 5138     68233            922                             高等電腦視覺
## 5139     49050            922                                 代謝體學
## 5140     78774            922                             機器學習特論
## 5141     34448            922                             系統研究專題
## 5142     15852            922                   適地性技術、應用與服務
## 5143     67783            922                             巨量資料系統
## 5144     34233            922                                 虛擬機器
## 5145     61326            941                                 博士論文
## 5146     27119            941                                 專題討論
## 5147     43125            941                                 碩士論文
## 5148     63822            941                                 專題討論
## 5149     45328            941                                 專題討論
## 5150     66071            941                               半導體光學
## 5151     37556            941                           光通訊元件導論
## 5152     23680            941                     雷射及非線性晶體應用
## 5153     39962            941                           半導體雷射原理
## 5154     71553            941                     有機光電半導體與元件
## 5155     26031            941                                 雷射導論
## 5156     27631            941                                 光纖感測
## 5157     80968            941                           量子物理與應用
## 5158     67272            941                             顯示技術導論
## 5159     11721            941                   奈米光電半導體製程技術
## 5160     31042            941                           液晶顯示器技術
## 5161     85951            941                                 矽光子學
## 5162     30765            941                     表面電漿子原理與應用
## 5163     89360            942                                 博士論文
## 5164     46403            942                                 專題討論
## 5165     22352            942                                 專題討論
## 5166     81783            942                                 碩士論文
## 5167     78947            942                                 專題討論
## 5168     44470            942                                 專題討論
## 5169     36353            942                         微波積體電路專題
## 5170     85279            942                               應用電磁學
## 5171     53798            942                   無線通訊功率放大器設計
## 5172     47086            942                               數位通信一
## 5173     66232            942                       系統構裝電源完整度
## 5174     17867            942                                 網路科學
## 5175     50101            943                                 博士論文
## 5176     34080            943                                 碩士論文
## 5177     78073            943                         高等類比積體電路
## 5178     39884            943                         積體電路系統測試
## 5179     24234            943                                 固態元件
## 5180     54354            943                             系統晶片驗證
## 5181     10347            943                             晶片系統封裝
## 5182     28716            943                     奈米積體電路實體設計
## 5183     47116            943                   微感測器及介面電路設計
## 5184     79177            943                       多媒體晶片系統設計
## 5185     14910            943                   專利舉發與侵害鑑定實務
## 5186     60799            943                           電子束技術實習
## 5187     51023            943                 醫電在神經系統疾病的應用
## 5188     47434            944                                 博士論文
## 5189     44024            944                                 專題研究
## 5190     22587            944                                 專題研究
## 5191     44106            944                                 專題研究
## 5192     42615            944                                 專題研究
## 5193     81296            944                                 專題研究
## 5194     39731            944                                 專題研究
## 5195     52935            944                                 專題研究
## 5196     11195            944                                 專題研究
## 5197     39108            944                                 專題研究
## 5198     75814            944                                 專題研究
## 5199     56670            944                                 專題研究
## 5200     26101            944                                 專題研究
## 5201     58648            944                                 專題研究
## 5202     75897            944                                 專題研究
## 5203     75809            944                                 專題研究
## 5204     81616            944                                 專題研究
## 5205     26849            944                                 專題研究
## 5206     46639            944                                 專題研究
## 5207     32017            944                                 專題研究
## 5208     15332            944                                 專題研究
## 5209     49885            944                                 專題研究
## 5210     50571            944                                 專題研究
## 5211     76677            944                                 專題研究
## 5212     75696            944                                 專題研究
## 5213     77503            944                                 專題研究
## 5214     52389            944                                 專題研究
## 5215     73815            944                                 專題研究
## 5216     51790            944                                 專題研究
## 5217     50317            944                                 專題討論
## 5218     48569            944                                 碩士論文
## 5219     58512            944                                 專題研究
## 5220     87843            944                                 專題研究
## 5221     11248            944                                 專題研究
## 5222     87024            944                                 專題研究
## 5223     21256            944                                 專題研究
## 5224     88984            944                                 專題研究
## 5225     17115            944                                 專題研究
## 5226     30321            944                                 專題研究
## 5227     53147            944                                 專題研究
## 5228     70488            944                                 專題研究
## 5229     79233            944                                 專題研究
## 5230     58290            944                                 專題研究
## 5231     88017            944                                 專題研究
## 5232     23474            944                                 專題研究
## 5233     15752            944                                 專題研究
## 5234     68054            944                                 專題研究
## 5235     74079            944                                 專題研究
## 5236     58316            944                                 專題研究
## 5237     66695            944                                 專題研究
## 5238     75218            944                                 專題研究
## 5239     14020            944                                 專題研究
## 5240     66329            944                                 專題研究
## 5241     88148            944                                 專題研究
## 5242     54631            944                                 專題研究
## 5243     46625            944                                 專題研究
## 5244     12595            944                                 專題研究
## 5245     47726            944                                 專題研究
## 5246     19346            944                                 專題研究
## 5247     33961            944                                 專題研究
## 5248     75581            944                                 專題研究
## 5249     48847            944                                 專題研究
## 5250     61529            944                                 專題研究
## 5251     40712            944                                 專題研究
## 5252     38873            944                                 專題研究
## 5253     50924            944                                 專題研究
## 5254     85082            944                                 專題研究
## 5255     35130            944                                 專題研究
## 5256     43503            944                                 專題研究
## 5257     37962            944                                 專題討論
## 5258     54736            944                                 網路藝術
## 5259     68344            944                       音樂訊號分析與檢索
## 5260     54183            945                                 博士論文
## 5261     49310            945                                 專題討論
## 5262     12830            945                                 專題討論
## 5263     85666            945                                 碩士論文
## 5264     60931            945                                 專題討論
## 5265     80726            945                                 專題討論
## 5266     30532            945                             光學診斷技術
## 5267     60237            945                   生醫微機電與微流道系統
## 5268     24469            A01                             法律人會計學
## 5269     64974            A01                                 法學緒論
## 5270     58310            A01                                 刑法分則
## 5271     38090            A01                               刑法總則二
## 5272     57974            A01                               刑法總則二
## 5273     38055            A01                               刑法總則二
## 5274     39917            A01                           民法債編總論一
## 5275     16494            A01                           民法債編總論一
## 5276     50487            A01                                   勞動法
## 5277     87158            A01                       商事法總論及公司法
## 5278     13517            A01                                 國際公法
## 5279     49327            A01                             國際海洋法二
## 5280     55615            A01                               國家責任法
## 5281     40844            A01                                   專利法
## 5282     50971            A01                         智慧財產權法導論
## 5283     75992            A01                                   財稅法
## 5284     32617            A01                               民法身分法
## 5285     45136            A01                               實用法醫學
## 5286     29358            A01                               行政救濟法
## 5287     35360            A01                               行政救濟法
## 5288     15657            A01                               刑事訴訟法
## 5289     18399            A01                           民事訴訟法甲下
## 5290     37041            A01                               非訟事件法
## 5291     33174            A01                                   海商法
## 5292     51204            A01                                   海商法
## 5293     43002            A01                                   海商法
## 5294     48163            A01                                   環境法
## 5295     18629            A01                               英美契約法
## 5296     68902            A01                               租稅法各論
## 5297     24865            A01                       日文法學名著選讀一
## 5298     22403            A01                       日文法學名著選讀一
## 5299     26633            A01                       日文法學名著選讀二
## 5300     79828            A01                       日文法學名著選讀三
## 5301     88175            A01                       日文法學名著選讀四
## 5302     87110            A01                       德文法學名著選讀一
## 5303     83684            A01                       德文法學名著選讀一
## 5304     25848            A01                       德文法學名著選讀二
## 5305     17701            A01                       德文法學名著選讀二
## 5306     29242            A01                       德文法學名著選讀三
## 5307     14292            A01                       德文法學名著選讀三
## 5308     71737            A01                       德文法學名著選讀四
## 5309     47676            A01                       德文法學名著選讀四
## 5310     41472            A01                       法文法學名著選讀一
## 5311     39835            A01                       法文法學名著選讀二
## 5312     44625            A01                       法文法學名著選讀三
## 5313     42579            A01                       法文法學名著選讀四
## 5314     62581            A01                       英美法學名著選讀一
## 5315     38599            A01                       英美法學名著選讀二
## 5316     89374            A01                         公司治理專題討論
## 5317     24577            A01                           行政法專題討論
## 5318     41064            A01                               社會保險法
## 5319     30995            A01                             刑事審判實務
## 5320     28506            A01                             法律實習一下
## 5321     81350            A01                             法律實習一下
## 5322     29251            A01                             法律實習二下
## 5323     42817            A01                             法律實習二下
## 5324     53492            A01                     公法實體程序綜合研討
## 5325     68878            A01                           西方法治思想史
## 5326     51482            A21                                 博士論文
## 5327     66204            A21                                 碩士論文
## 5328     58021            A21                       法律實習專題研究一
## 5329     55305            A21                         法理學專題研究一
## 5330     57797            A21                       憲法理論專題研究一
## 5331     37454            A21                       憲法理論專題研究二
## 5332     51555            A21                       比較刑法專題研究一
## 5333     67486            A21                       比較刑法專題研究二
## 5334     60281            A21                             冤罪救援實務
## 5335     79768            A21                     刑事程序與國際人權一
## 5336     40091            A21                     刑事程序與國際人權二
## 5337     61663            A21                     刑事程序與國際人權三
## 5338     75823            A21                     刑事程序與國際人權四
## 5339     17764            A21                   環境及科技法專題研究一
## 5340     45181            A21                         著作權法專題研究
## 5341     18624            A21                         勞工法專題研究一
## 5342     89748            A21                         勞工法專題研究二
## 5343     61298            A21                         勞工法專題研究三
## 5344     47154            A21                         勞工法專題研究四
## 5345     25407            A21                     國際經濟法專題研究一
## 5346     21536            A21                     國際經濟法專題研究二
## 5347     10797            A21                         財政法專題研究一
## 5348     76791            A21                         經濟法專題研究一
## 5349     89030            A21                         經濟法專題研究二
## 5350     72651            A21                         經濟法專題研究三
## 5351     75535            A21                         經濟法專題研究四
## 5352     64332            A21                         貿易法專題研究一
## 5353     56245            A21                         貿易法專題研究二
## 5354     16948            A21                         貿易法專題研究三
## 5355     32348            A21                           稅法專題研究一
## 5356     59464            A21                           稅法專題研究二
## 5357     78967            A21                           稅法專題研究三
## 5358     55014            A21                           稅法專題研究四
## 5359     11563            A21                         海洋法專題研究一
## 5360     69837            A21                         海洋法專題研究二
## 5361     15623            A21                         海洋法專題研究三
## 5362     17001            A21                         海洋法專題研究四
## 5363     52997            A21                         保險法專題研究一
## 5364     12824            A21                         保險法專題研究二
## 5365     22725            A21                         契約法專題研究一
## 5366     23653            A21                         契約法專題研究二
## 5367     80537            A21                         契約法專題研究三
## 5368     46685            A21                   智慧財產權法專題研究一
## 5369     32681            A21                   智慧財產權法專題研究二
## 5370     87477            A21                   智慧財產權法專題研究三
## 5371     31916            A21                   智慧財產權法專題研究四
## 5372     70671            A21                     警察行政法專題研究一
## 5373     95049            A21                     警察行政法專題研究二
## 5374     95050            A21                     警察行政法專題研究三
## 5375     95051            A21                     警察行政法專題研究四
## 5376     33299            A21                 競爭法與智慧財產法專研一
## 5377     33117            A21                 競爭法與智慧財產法專研二
## 5378     58988            A21                 競爭法與智慧財產法專研三
## 5379     19316            A21                 競爭法與智慧財產法專研四
## 5380     72619            A21               比較企業金融法制專題研究一
## 5381     40252            A21               比較企業金融法制專題研究二
## 5382     16454            A21               比較企業金融法制專題研究三
## 5383     75922            A21               比較企業金融法制專題研究四
## 5384     79680            A21                   企業暨金融法專題研究一
## 5385     40980            A21                     國際環境法專題研究一
## 5386     40282            A21                     國際環境法專題研究二
## 5387     34872            A21 「基礎法學之理論與方法:法律與社會群組」
## 5388     27419            A21                   金融市場監理專題研究一
## 5389     55858            A21                   金融市場監理專題研究二
## 5390     24551            A21                     比較契約法專題研究一
## 5391     21346            A21                     經濟行政法專題研究一
## 5392     55243            A21                     經濟行政法專題研究二
## 5393     74806            A21                               證券交易法
## 5394     12156            A21                           銀行法專題研究
## 5395     50662            A21                       比較公司法專題討論
## 5396     81239            A21                           法律經濟分析一
## 5397     40166            A21                           法律經濟分析二
## 5398     81171            A21                                 言論自由
## 5399     34210            A21                                 國際稅法
## 5400     89103            A21                         英國及歐洲公司法
## 5401     88445            A21                       醫療民事法專題討論
## 5402     16391            A21                 媒體法、新技術與憲法權利
## 5403     65737            A21                     國際身心障礙者權利法
## 5404     54605            A21                             航空及太空法
## 5405     75002            A41                                 碩士論文
## 5406     33105            A41                             民事訴訟法下
## 5407     68477            A41                           民法債編總論二
## 5408     88567            A41                             民法債編各論
## 5409     33727            A41                                 刑法分則
## 5410     83655            A41                                   行政法
## 5411     69483            B00                             學術英文寫作
## 5412     55707            B01                           普通生物學甲下
## 5413     32639            B01                             普通生物學乙
## 5414     78857            B01                           普通生物學乙下
## 5415     83022            B01                           普通生物學乙下
## 5416     44394            B01                           普通生物學乙下
## 5417     79135            B01                           普通生物學乙下
## 5418     28277            B01                             普通生物學丙
## 5419     24609            B01                             普通生物學丙
## 5420     83841            B01                               普通動物學
## 5421     49101            B01                       普通生物學實驗甲下
## 5422     67700            B01                       普通生物學實驗甲下
## 5423     11251            B01                       普通生物學實驗乙下
## 5424     14230            B01                       普通生物學實驗乙下
## 5425     78729            B01                       普通生物學實驗乙下
## 5426     72906            B01                       普通生物學實驗乙下
## 5427     42921            B01                       普通生物學實驗乙下
## 5428     83019            B01                       普通生物學實驗乙下
## 5429     50007            B01                       普通生物學實驗乙下
## 5430     81784            B01                         普通生物學實驗丙
## 5431     63456            B01                         普通生物學實驗丙
## 5432     20090            B01                         普通生物學實驗丙
## 5433     50561            B01                         普通生物學實驗丙
## 5434     30401            B01                         普通生物學實驗丙
## 5435     25515            B01                         普通生物學實驗丙
## 5436     66985            B01                         普通生物學實驗丙
## 5437     77908            B01                           普通動物學實驗
## 5438     54055            B01                           普通動物學實驗
## 5439     88813            B01                           普通植物學實驗
## 5440     45805            B01                           普通植物學實驗
## 5441     68532            B01                           生物多樣性概論
## 5442     10184            B01                             遺傳工程概論
## 5443     68720            B01                         現代生物學之應用
## 5444     73099            B01                           鯨豚保育生物學
## 5445     23538            B01                           生物、演化與人
## 5446     38649            B01                               細胞生物學
## 5447     44720            B01                               動物組織學
## 5448     34689            B01                             無脊椎動物學
## 5449     12393            B01                         無脊椎動物學實驗
## 5450     76327            B01                             綠色生物科技
## 5451     45094            B01                               遺傳學實驗
## 5452     27457            B01                               遺傳學實驗
## 5453     79328            B01                               植物生理學
## 5454     83990            B01                           植物生理學實驗
## 5455     42777            B01                           植物生理學實驗
## 5456     19608            B01                           神經生物學實驗
## 5457     88237            B01                                   生態學
## 5458     79268            B01                               生態學實驗
## 5459     16832            B01                             海洋生命科學
## 5460     68958            B01                           書報討論(二)
## 5461     54788            B01                           書報討論(二)
## 5462     67542            B01                           書報討論(二)
## 5463     52781            B01                           發生生物學實驗
## 5464     15134            B01                                 學士論文
## 5465     20168            B01                                 學士論文
## 5466     59294            B01                                 學士論文
## 5467     66383            B01                                 學士論文
## 5468     79236            B01                                 學士論文
## 5469     18614            B01                                 學士論文
## 5470     37175            B01                                 學士論文
## 5471     69816            B01                                 專題研究
## 5472     64726            B01                                 專題研究
## 5473     34556            B01                                 專題研究
## 5474     45535            B01                                 專題研究
## 5475     43341            B01                                 專題研究
## 5476     14014            B01                                 專題研究
## 5477     35514            B01                                 專題研究
## 5478     46233            B01                                 專題研究
## 5479     33138            B01                                 專題研究
## 5480     56295            B01                                 專題研究
## 5481     14203            B01                                 專題研究
## 5482     19938            B01                                 專題研究
## 5483     30420            B01                                 專題研究
## 5484     52576            B01                                 專題研究
## 5485     48874            B01                                 專題研究
## 5486     10896            B01                                 專題研究
## 5487     30957            B01                                 專題研究
## 5488     82882            B01                                 專題研究
## 5489     67927            B01                                 專題研究
## 5490     41269            B01                                 專題研究
## 5491     11770            B01                                 專題研究
## 5492     85670            B01                                 專題研究
## 5493     19085            B01                                 專題研究
## 5494     29230            B01                                 專題研究
## 5495     87546            B01                                 專題研究
## 5496     17911            B01                                 專題研究
## 5497     41464            B01                                 專題研究
## 5498     20377            B01                                 專題研究
## 5499     74100            B01                                 專題研究
## 5500     69591            B01                                 專題研究
## 5501     72817            B01                                 專題研究
## 5502     64118            B01                                 專題研究
## 5503     21646            B01                                 專題研究
## 5504     38315            B01                                 專題研究
## 5505     89511            B01                                 專題研究
## 5506     38489            B01                                 專題研究
## 5507     19452            B01                                 專題研究
## 5508     31399            B01                                 專題研究
## 5509     50061            B01                                 專題研究
## 5510     79457            B02                             生物化學實驗
## 5511     45808            B02                             生物化學實驗
## 5512     17050            B02                           生物物理化學下
## 5513     30831            B02                               微生物學下
## 5514     50649            B02                             微生物學實驗
## 5515     17858            B02                             微生物學實驗
## 5516     57064            B02                             生化科技專研
## 5517     44672            B02                           營養生化學實驗
## 5518     88385            B02                 生化科技專案設計與實務一
## 5519     17862            B02                             生物化學乙下
## 5520     41005            B02                               專題研究二
## 5521     62477            B02                               專題研究二
## 5522     49953            B02                               專題研究二
## 5523     37125            B02                               專題研究二
## 5524     45259            B02                               專題研究二
## 5525     70023            B02                               專題研究二
## 5526     37387            B02                               專題研究二
## 5527     23270            B02                               專題研究二
## 5528     66896            B02                               專題研究二
## 5529     50225            B02                               專題研究二
## 5530     72842            B02                               專題研究二
## 5531     34038            B02                               專題研究二
## 5532     48010            B02                               專題研究二
## 5533     12508            B02                               專題研究二
## 5534     47541            B02                               專題研究二
## 5535     49478            B21                                 博士論文
## 5536     51863            B21                                 碩士論文
## 5537     18446            B21                       碩士班論文專題報告
## 5538     45118            B21                       分子演化學專題討論
## 5539     22947            B21                       神經生理學專題討論
## 5540     40335            B21                           免疫學專題討論
## 5541     23025            B21                     分子內分泌學專題討論
## 5542     53270            B21                           發生學專題討論
## 5543     20748            B21                       神經生物學專題討論
## 5544     31546            B21                       細胞生物學專題討論
## 5545     26788            B21                         循環生理專題討論
## 5546     51794            B21                     神經細胞生理專題討論
## 5547     58442            B21                     基因表現調控專題討論
## 5548     12165            B21                         寄生蟲學專題討論
## 5549     59713            B21               生理時鐘與感光細胞專題討論
## 5550     24993            B21                       比較發生學專題討論
## 5551     49977            B21                           神經細胞學實驗
## 5552     65755            B21                       動物學實驗教學實習
## 5553     16462            B21                       植物學實驗教學實習
## 5554     12497            B21                           神經生理學實驗
## 5555     28782            B21                               演化生物學
## 5556     62299            B21                               魚類多樣性
## 5557     10821            B21                         分子與細胞免疫學
## 5558     40567            B21                               生物資訊學
## 5559     13110            B22                                 博士論文
## 5560     47776            B22                                 專題討論
## 5561     20781            B22                                 專題討論
## 5562     85531            B22                                 專題討論
## 5563     16377            B22                                 專題討論
## 5564     83708            B22                               專題研究二
## 5565     89837            B22                               專題研究二
## 5566     38966            B22                               專題研究二
## 5567     74915            B22                               專題研究二
## 5568     11768            B22                               專題研究二
## 5569     54362            B22                               專題研究二
## 5570     10746            B22                               專題研究二
## 5571     21648            B22                               專題研究二
## 5572     71977            B22                               專題研究二
## 5573     52315            B22                               專題研究二
## 5574     26913            B22                               專題研究四
## 5575     83836            B22                               專題研究四
## 5576     64942            B22                               專題研究四
## 5577     66949            B22                               專題研究四
## 5578     18647            B22                               專題研究四
## 5579     27357            B22                               專題研究四
## 5580     17469            B22                               專題研究四
## 5581     38159            B22                               專題研究四
## 5582     75415            B22                               專題研究四
## 5583     67112            B22                               專題研究四
## 5584     69757            B22                               專題研究四
## 5585     83503            B22                               專題研究四
## 5586     50204            B22                             進階生化探索
## 5587     42102            B22                       生技博士論文精研三
## 5588     34864            B22                       生技博士論文精研四
## 5589     60297            B22                                 碩士論文
## 5590     26019            B22                                 專題討論
## 5591     22356            B22                                 專題討論
## 5592     72745            B22                                 專題討論
## 5593     43344            B22                                 專題討論
## 5594     70347            B22                         生化科技實驗法二
## 5595     68982            B22                           植物之二級代謝
## 5596     80426            B22                     蛋白質養晶概論與實作
## 5597     38141            B22                               專題研究二
## 5598     10496            B22                               專題研究二
## 5599     47721            B22                               專題研究二
## 5600     52634            B22                               專題研究二
## 5601     77865            B22                               專題研究二
## 5602     25713            B22                               專題研究二
## 5603     26722            B22                               專題研究二
## 5604     69194            B22                               專題研究二
## 5605     63469            B22                               專題研究二
## 5606     42416            B22                               專題研究二
## 5607     53685            B22                               專題研究二
## 5608     86849            B22                               專題研究二
## 5609     89686            B22                               專題研究二
## 5610     53777            B22                               專題研究二
## 5611     84656            B22                               專題研究二
## 5612     55789            B22                               專題研究二
## 5613     31248            B22                               專題研究二
## 5614     67098            B22                               專題研究二
## 5615     83421            B22                               專題研究二
## 5616     27712            B22                               專題研究二
## 5617     50970            B22                               專題研究二
## 5618     70734            B22                               專題研究二
## 5619     58193            B22                         生化科技教學實習
## 5620     36690            B22                         生化科技教學實習
## 5621     80383            B22                                   免疫學
## 5622     61148            B22           營養添加物與植物藥物之研發特論
## 5623     19253            B22                                 生醫分析
## 5624     11553            B22                     幹細胞與再生醫學前瞻
## 5625     59502            B22                     問題導向的轉譯研究二
## 5626     31849            B42                                 博士論文
## 5627     66698            B42                                 專題研究
## 5628     75341            B42                                 專題研究
## 5629     77640            B42                                 專題研究
## 5630     66091            B42                                 專題研究
## 5631     25242            B42                                 專題研究
## 5632     50264            B42                                 專題研究
## 5633     75468            B42                                 專題研究
## 5634     84955            B42                                 專題研究
## 5635     24888            B42                                 專題研究
## 5636     76193            B42                                 專題討論
## 5637     68698            B42                                 碩士論文
## 5638     86718            B42                                 專題研究
## 5639     70094            B42                                 專題研究
## 5640     57106            B42                                 專題研究
## 5641     70140            B42                                 專題研究
## 5642     29817            B42                                 專題研究
## 5643     67052            B42                                 專題研究
## 5644     38504            B42                                 專題研究
## 5645     29464            B42                                 專題研究
## 5646     54279            B42                                 專題研究
## 5647     40868            B42                                 專題研究
## 5648     19273            B42                                 專題研究
## 5649     33696            B42                                 專題研究
## 5650     46899            B42                                 專題討論
## 5651     62674            B42                                 專題討論
## 5652     34098            B42                                 專題討論
## 5653     82277            B42                             植物科學特論
## 5654     65398            B42                             植物科學特論
## 5655     37084            B42                             植物科學特論
## 5656     22493            B42                             植物科學特論
## 5657     40851            B42                             植物科學特論
## 5658     19924            B42                           植物生長與發育
## 5659     13649            B42                               蛋白質體學
## 5660     24851            B42                       進階植物分子生物學
## 5661     67013            B43                                 博士論文
## 5662     50244            B43                           博士班專題討論
## 5663     16801            B43                                 專題研究
## 5664     42158            B43                                 專題研究
## 5665     72427            B43                                 專題研究
## 5666     31777            B43                                 專題研究
## 5667     57702            B43                                 專題研究
## 5668     16535            B43                                 碩士論文
## 5669     88796            B43                           碩士班專題討論
## 5670     85830            B43                                 專題研究
## 5671     82184            B43                                 專題研究
## 5672     22666            B43                                 專題研究
## 5673     37473            B43                                 專題研究
## 5674     61934            B43                                 專題研究
## 5675     68355            B43                                 專題研究
## 5676     67512            B43                                 專題研究
## 5677     46684            B43                                 專題研究
## 5678     49962            B43                                 專題研究
## 5679     47184            B43                                 專題研究
## 5680     27320            B43                                 專題研究
## 5681     32195            B43                                 專題研究
## 5682     62981            B43                   分子發育遺傳學專題討論
## 5683     10230            B43                       基因與發育專題討論
## 5684     76582            B43                 酵母菌分子遺傳學專題討論
## 5685     66272            B43                       系統生物學專題討論
## 5686     17081            B43               系統與合成生物學專題討論下
## 5687     13249            B43                             線蟲論文選讀
## 5688     74845            B43                 模式魚種胚胎學專題討論二
## 5689     79228            B43                           發生生物學專論
## 5690     16464            B43                               果蠅胚胎學
## 5691     58157            B43                                 細胞週期
## 5692     60637            B43                                 神經傳導
## 5693     66442            B43                         養份吸收專題討論
## 5694     55316            B43                   蛋白質胞內運輸專題討論
## 5695     32280            B43                     單分子生物學專題討論
## 5696     20954            B44                                 博士論文
## 5697     71053            B44                           博士班專題討論
## 5698     66604            B44                                 專題研究
## 5699     54601            B44                                 專題研究
## 5700     68023            B44                                 專題研究
## 5701     69507            B44                                 專題研究
## 5702     72643            B44                                 專題研究
## 5703     43636            B44                                 專題研究
## 5704     14849            B44                                 專題研究
## 5705     34651            B44                                 專題研究
## 5706     61643            B44                                 專題研究
## 5707     44293            B44                                 專題研究
## 5708     64903            B44                                 專題研究
## 5709     25130            B44                                 專題研究
## 5710     16764            B44                                 專題研究
## 5711     38254            B44                                 碩士論文
## 5712     51968            B44                           碩士班專題討論
## 5713     67762            B44                                 專題研究
## 5714     75418            B44                                 專題研究
## 5715     12902            B44                                 專題研究
## 5716     76137            B44                                 專題研究
## 5717     75500            B44                                 專題研究
## 5718     33160            B44                                 專題研究
## 5719     53666            B44                                 專題研究
## 5720     69631            B44                                 專題研究
## 5721     41386            B44                                 專題研究
## 5722     62158            B44                                 專題研究
## 5723     70254            B44                                 專題研究
## 5724     16203            B44                                 專題研究
## 5725     12688            B44                                 專題研究
## 5726     30229            B44                                 專題研究
## 5727     21637            B44                         空間分析專題討論
## 5728     68360            B44                           蕨類植物分類學
## 5729     77687            B44                           植物形態形成學
## 5730     73926            B44                                   菌類學
## 5731     67715            B44                     生物電子顯微鏡技術學
## 5732     34066            B44                潮間帶生態學:田野調查體驗
## 5733     50991            B44                               保育生物學
## 5734     79427            B44                         植物與動物的關係
## 5735     84594            B45                                 博士論文
## 5736     44536            B45                           博士班專題討論
## 5737     68198            B45                                 碩士論文
## 5738     56984            B45                           碩士班專題討論
## 5739     57344            B45                                 專題研究
## 5740     35187            B45                             藻類生物技術
## 5741     17698            B45                           水產資源學專論
## 5742     11822            B45                           高等水產飼料學
## 5743     63228            B45                               實驗藻類學
## 5744     29519            B45                           魚類生殖生物學
## 5745     40949            B45                         水產養殖技術特論
## 5746     59714            B45                           碩士班專題討論
## 5747     20772            B45                           海洋漁業生態學
## 5748     49420            B45                               水產養殖學
## 5749     10968            B45                       水產養殖生產認驗證
## 5750     68259            B46                             生物化學乙下
## 5751     26627            B46                             生物化學甲下
## 5752     34397            B46                                 博士論文
## 5753     88945            B46                                 專題研究
## 5754     19973            B46                                 專題研究
## 5755     32801            B46                                 專題研究
## 5756     86654            B46                                 專題研究
## 5757     18036            B46                                 專題研究
## 5758     81440            B46                                 專題研究
## 5759     49392            B46                                 專題研究
## 5760     68988            B46                                 專題研究
## 5761     47117            B46                                 專題研究
## 5762     80705            B46                                 專題研究
## 5763     63492            B46                                 專題研究
## 5764     26614            B46                                 專題研究
## 5765     73872            B46                                 專題研究
## 5766     46102            B46                                 專題研究
## 5767     68763            B46                                 專題討論
## 5768     10438            B46                                 專題討論
## 5769     73978            B46                                 專題討論
## 5770     78321            B46                                 書報討論
## 5771     83677            B46                                 書報討論
## 5772     58934            B46                                 書報討論
## 5773     81969            B46                                 書報討論
## 5774     62432            B46                                 書報討論
## 5775     34856            B46                                 書報討論
## 5776     86006            B46                               初級中文下
## 5777     70867            B46                               實驗室見習
## 5778     57204            B46                       實驗分子生物物理學
## 5779     89393            B46                                 專題演講
## 5780     69024            B46                                 分子醫學
## 5781     46693            B46                           生化與藥物開發
## 5782     56455            B46                           研究技術與實作
## 5783     38718            B46                                 碩士論文
## 5784     11779            B46                                 專題研究
## 5785     66300            B46                                 專題研究
## 5786     17424            B46                                 專題研究
## 5787     73118            B46                                 專題研究
## 5788     17620            B46                                 專題研究
## 5789     31573            B46                                 專題研究
## 5790     65857            B46                                 專題研究
## 5791     66684            B46                                 專題研究
## 5792     41616            B46                                 專題研究
## 5793     53715            B46                                 專題研究
## 5794     19859            B46                                 專題研究
## 5795     77291            B46                                 專題研究
## 5796     59963            B46                                 專題研究
## 5797     54985            B46                                 專題研究
## 5798     76248            B46                                 專題討論
## 5799     18851            B46                                 專題討論
## 5800     42228            B46                                 專題討論
## 5801     60169            B46                                 書報討論
## 5802     88579            B46                                 書報討論
## 5803     82355            B46                                 書報討論
## 5804     77560            B46                                 書報討論
## 5805     56403            B46                                 書報討論
## 5806     68823            B46                           細胞生長與凋零
## 5807     42934            B46                       偉大生化學家的故事
## 5808     56503            B46                 科學家的洞察力與基本技巧
## 5809     83745            B46                 蛋白體與後修飾之質譜分析
## 5810     43761            B48                                 博士論文
## 5811     38263            B48                             實驗技術實習
## 5812     55998            B48                           博士班專題研究
## 5813     35627            B48                           博士班專題研究
## 5814     37287            B48                           博士班專題研究
## 5815     73640            B48                           博士班專題研究
## 5816     52189            B48                           博士班專題研究
## 5817     31394            B48                           博士班專題研究
## 5818     37893            B48                           博士班專題研究
## 5819     83330            B48                           博士班專題研究
## 5820     50720            B48                           博士班專題研究
## 5821     24957            B48                           博士班專題研究
## 5822     65111            B48                           博士班專題研究
## 5823     67507            B48                           博士班專題研究
## 5824     65829            B48                           博士班專題研究
## 5825     64414            B48                           博士班專題研究
## 5826     66458            B48                           博士班專題研究
## 5827     69742            B48                           博士班專題研究
## 5828     49279            B48                           博士班專題研究
## 5829     54303            B48                           博士班專題研究
## 5830     84262            B48                           博士班專題研究
## 5831     45756            B48                           博士班專題研究
## 5832     38811            B48                           博士班專題研究
## 5833     83217            B48                           博士班專題研究
## 5834     68966            B48                           博士班專題研究
## 5835     53547            B48                           博士班專題研究
## 5836     77078            B48                           博士班專題研究
## 5837     66541            B48                           博士班專題研究
## 5838     46445            B48                           博士班專題研究
## 5839     47707            B48                           博士班專題研究
## 5840     23461            B48                           博士班專題研究
## 5841     68804            B48                           博士班專題討論
## 5842     77989            B48                                 碩士論文
## 5843     22022            B48                           碩士班專題研究
## 5844     46073            B48                           碩士班專題研究
## 5845     71915            B48                           碩士班專題研究
## 5846     15683            B48                           碩士班專題研究
## 5847     82799            B48                           碩士班專題研究
## 5848     14115            B48                           碩士班專題研究
## 5849     10520            B48                           碩士班專題研究
## 5850     18023            B48                           碩士班專題研究
## 5851     44795            B48                           碩士班專題討論
## 5852     26949            B48               基因體與系統生物學專題討論
## 5853     52973            H01                                     邏輯
## 5854     66570            H01          數學與文化:以數學小說閱讀為進路
## 5855     50852            H01                                 猶太文化
## 5856     17198            H01                       職場倫理與職場精神
## 5857     25460            H01              探索臺灣:臺灣電影與臺灣社會
## 5858     46712            H01                       法國當代文化與思潮
## 5859     41146            H02                           使用者經驗設計
## 5860     55684            J10                                 碩士論文
## 5861     24132            P01                                 教育概論
## 5862     86853            P01                               教育心理學
## 5863     73276            P01                           輔導原理與實務
## 5864     55608            P01                               教育社會學
## 5865     16798            P01                                 班級經營
## 5866     84082            P01                                 教育哲學
## 5867     42931            P01                                 教學原理
## 5868     24808            P01                           教學媒體與運用
## 5869     26282            P01                    國文/語文領域教材教法
## 5870     46075            P01                      英語文/領域教材教法
## 5871     70374            P01                        數學/領域教材教法
## 5872     14396            P01            中等學校-公民與社會科教材教法
## 5873     17653            P01                                 環境教育
## 5874     82379            P01                           教育政策與法令
## 5875     52698            P01                           課程發展與設計
## 5876     49057            P01                             特殊教育概論
## 5877     83021            P01                       生命教育理論與教學
## 5878     60205            P01                         閱讀理解策略教學
## 5879     48218            P01                       第二外國語教學實習
## 5880     58534            P01                  物理科/自然領域教學實習
## 5881     76868            P01                  化學科/自然領域教學實習
## 5882     36926            P01                    地球科學/領域教學實習
## 5883     83501            P01                  生物科/自然領域教學實習
## 5884     52133            P01                  歷史科/社會領域教學實習
## 5885     81662            P01                  地理科/社會領域教學實習
## 5886     11962            P01                  國文/語文領域教學實習二
## 5887     71822            P01                    英語文/領域教學實習二
## 5888     48237            P01                      數學/領域教學實習二
## 5889     49727            P01                     土木與建築群教學實習
## 5890     64373            P01                           機械群教學實習
## 5891     78346            P01                       電機電子群教學實習
## 5892     39908            P01                           農業群教學實習
## 5893     41105            P01            中等學校-公民與社會科教學實習
## 5894     43392            P01                         社會學習領域概論
## 5895     57929            P03                       婦女與性別研究導論
## 5896     84362            P05                               分子生物學
## 5897     70532            P05                         生物技術核心實驗
## 5898     85638            P05                         生物技術核心實驗
## 5899     61921            P05                         蛋白質結構與功能
## 5900     19899            P05                   生物分子交互作用之網絡
## 5901     10739            P05                       分子與細胞生物科技
## 5902     58216            P12                             知識管理專題
## 5903     71683            P12                             知識管理專題
## 5904     26174            P30                   胚與幹細胞顯微操作技術
## 5905     71287            P35                       老人與長期照護導論
## 5906     85950            P36                             組織運作導論
## 5907     72416            P36                         典範企業運作思維
## 5908     38020            P37                           使用者經驗設計
## 5909     14431            P37                               藝術與創作
## 5910     18053            P37                         國際青年創業專案
## 5911     36389            Q01               工程學術英文寫作與口頭報告
## 5912     39888            Q01                   學術英文論文寫作與發表
## 5913     64998            Q01                   學術英文論文寫作與發表
## 5914     39528            Q01                         學術英文口頭報告
## 5915     49212            Q01                         學術英文口頭報告
## 5916     85978            Q01                             英文寫作基礎
## 5917     52086            Q01                             英文寫作基礎
## 5918     85850            Q01                             英文寫作基礎
## 5919     68470            Q01                             英文寫作基礎
## 5920     80713            Q01                             英文寫作基礎
## 5921     55488            Q01                             學術論文寫作
## 5922     63734            Q01                             學術論文寫作
##      avgGPA               prof.
## 1      3.69              黃國恩
## 2      3.93              黃欽永
## 3      3.63              許君恆
## 4      3.85              許君恆
## 5      3.70              林怡秀
## 6      3.67              簡坤鐘
## 7      3.58              陳美莉
## 8      3.57              陳美莉
## 9      3.66              陳美莉
## 10     3.70              陳美莉
## 11     3.70              李坤培
## 12     3.65              李坤培
## 13     3.72              李坤培
## 14     3.76              李坤培
## 15     3.76              黃欽永
## 16     3.85              黃欽永
## 17     3.76              黃欽永
## 18     4.14              連家瑩
## 19     3.83              洪巧菱
## 20     3.92              連家瑩
## 21     3.79              呂宛蓁
## 22     3.80              呂宛蓁
## 23     4.07              洪巧菱
## 24     4.03              金敏玲
## 25     4.12              金敏玲
## 26     3.21              陳志一
## 27     3.81              逄廣華
## 28     3.92              簡坤鐘
## 29     3.88              簡坤鐘
## 30     3.96              簡坤鐘
## 31     2.95              連玉輝
## 32     3.11              連玉輝
## 33     4.12              王澤惠
## 34     3.89              王澤惠
## 35     3.59              連玉輝
## 36     4.00              黃欽永
## 37     3.00              徐維娟
## 38     3.29              宋麗梅
## 39     2.87              葉德蘭
## 40     2.61              王珊珊
## 41     3.62              楊乃冬
## 42     2.83              黃恆綜
## 43     2.95              徐維娟
## 44     2.92              許文僊
## 45     3.39              葉國良
## 46     3.70              彭美玲
## 47     3.58              黃啟書
## 48     3.38              潘少瑜
## 49     3.31              劉正忠
## 50     3.68              陳翠英
## 51     3.82              高嘉謙
## 52     3.80              梅家玲
## 53     3.80              許暉林
## 54     3.76              陳昭瑛
## 55     3.47              林宏佳
## 56     3.24              徐富昌
## 57     3.24                丁亮
## 58     3.00              魏岫明
## 59     3.17              魏岫明
## 60     3.73              林永勝
## 61     3.41              張素卿
## 62     3.31              曹美秀
## 63     3.55              羅鈴沛
## 64     3.77              蔡祝青
## 65     3.47              歐麗娟
## 66     3.46              黃奕珍
## 67     3.23              吳旻旻
## 68     3.54              汪詩珮
## 69     3.70              謝佩芬
## 70     3.61              侯潔之
## 71     3.59              曹淑娟
## 72     3.50              劉少雄
## 73     3.70              蔡世豪
## 74     3.11              李存智
## 75     2.89              徐芳敏
## 76     3.87              彭美玲
## 77     3.83              蔣秋華
## 78     3.23              葉國良
## 79     3.76              盧桂珍
## 80     3.71              蔡璧名
## 81     3.63              宋淑萍
## 82     3.47              李文鈺
## 83     3.31                蔡瑜
## 84     3.76              康韻梅
## 85     3.49              吳旻旻
## 86     3.50              李惠綿
## 87     3.42              李文鈺
## 88     3.10              劉文清
## 89     3.03              楊秀芳
## 90     3.15              徐聖心
## 91     3.18              蔡振豐
## 92     3.68              魏岫明
## 93     3.20              蔡宜妮
## 94     3.40              劉少雄
## 95     3.67              羅濟立
## 96     3.88              李錫鎮
## 97     3.93              蕭素英
## 98     3.55              卓清芬
## 99     3.65              曾德明
## 100    3.98              曾德明
## 101    4.13              莊吉發
## 102    4.12              莊吉發
## 103    4.20              蕭素英
## 104    3.41              劉雅詩
## 105    3.59              姜台芬
## 106    3.40              高瑟濡
## 107    3.48              李紀舍
## 108    3.51              王沐嵐
## 109    4.27              奇邁可
## 110    3.58              林祐瑜
## 111    3.54              王珊珊
## 112    3.73              阮綺霞
## 113    3.55              謝艾米
## 114    3.59              沈志中
## 115    3.60              陳維玲
## 116    3.67              林湘漪
## 117    3.42              陳素麗
## 118    3.66              陳素麗
## 119    3.33              歐德尼
## 120    3.67              葉麗儀
## 121    3.68              阮綺霞
## 122    3.42              陳維玲
## 123    3.82              蔡嘉穎
## 124    3.86              蔡嘉穎
## 125    3.73            拉貝明契
## 126    3.53              林倩君
## 127    3.64              李秀蓮
## 128    3.68              李秀蓮
## 129    3.31              白保羅
## 130    3.80              馬里奧
## 131    3.65              杜孝捷
## 132    3.86              鮑曉鷗
## 133    3.71              馬里奧
## 134    3.79              馬里奧
## 135    3.79              杜孝捷
## 136    4.00              杜孝捷
## 137    3.48              張雯媛
## 138    3.60              熊宗慧
## 139    3.63              熊宗慧
## 140    3.89              楊明蒼
## 141    3.75              初雅士
## 142    3.60              初雅士
## 143    3.79              范吉歐
## 144    3.12            歐陽永樂
## 145    3.82                圖莉
## 146    3.60              林祖誠
## 147    3.44              敖馨郁
## 148    3.81              初雅士
## 149    4.01              陳音卉
## 150    3.62              劉雅詩
## 151    3.83              奇邁可
## 152    3.57              許以心
## 153    3.70              翁家傑
## 154    3.31              齊東耿
## 155    3.67              張惠娟
## 156    2.95              廖咸浩
## 157    3.67              柏逸嘉
## 158    3.73              朱偉誠
## 159    4.00              廖勇超
## 160    3.85              姜台芬
## 161    3.51              史嘉琳
## 162    3.98              胥嘉陵
## 163    4.08              張嘉倩
## 164    3.62        鍾玉<U+73CF>
## 165    3.75                    
## 166    3.65              奚永慧
## 167    3.88              張嘉倩
## 168    3.60              蔡自青
## 169    3.68              王珊珊
## 170    3.77              馬耀民
## 171    3.87              石岱崙
## 172    3.91              蔡自青
## 173    3.81              阮綺霞
## 174    3.72              謝艾米
## 175    3.51              陳維玲
## 176    3.80              葉麗儀
## 177    3.71              林湘漪
## 178    4.11              漢駿緯
## 179    3.68                簡潔
## 180    3.99              漢駿緯
## 181    4.10              漢駿緯
## 182    3.53            拉貝明契
## 183    3.42              吳沃剛
## 184    3.64              鮑曉鷗
## 185    3.85              張雯媛
## 186    3.63              張雯媛
## 187    3.22              馬里奧
## 188    4.01              索奧加
## 189    4.09              林翰司
## 190    4.00              范吉歐
## 191    3.45                圖莉
## 192    3.85              林祖誠
## 193    3.34              敖馨郁
## 194    4.01              陳音卉
## 195    3.81              楊乃冬
## 196    3.62              范吉歐
## 197    3.30              朱杰佑
## 198    3.44              謝艾米
## 199    3.43              林倩君
## 200    3.83                簡潔
## 201    3.17              吳沃剛
## 202    3.77              白保羅
## 203    3.75              白保羅
## 204    4.01              林湘漪
## 205    4.30              索奧加
## 206    3.80                簡潔
## 207    3.40              吳沃剛
## 208    3.92              白保羅
## 209    3.54              梁欣榮
## 210    3.43              奚永慧
## 211    3.61              李欣穎
## 212    3.52              王寶祥
## 213    3.35              沈曉茵
## 214    3.45              施純宜
## 215    3.85              黃宗慧
## 216    4.23              漢駿緯
## 217    3.61              初雅士
## 218    3.52              賀安莉
## 219    3.88              高瑟濡
## 220    3.68              姜台芬
## 221    3.61              王芮思
## 222    3.83              胥嘉陵
## 223    3.80              林祐瑜
## 224    3.36              鄺慧琪
## 225    3.36              劉雅詩
## 226    3.78              許以心
## 227    3.42              賀安莉
## 228    3.02              何泰鈞
## 229    3.33              曾琦智
## 230    3.52              辜炳達
## 231    3.48              朱杰佑
## 232    3.40              黃馨瑩
## 233    3.99              陳逸軒
## 234    3.59              陳重仁
## 235    3.95              林婉瑜
## 236    3.22              鄺慧琪
## 237    3.14              曾麗玲
## 238    3.76              齊東耿
## 239    3.28              黃山耘
## 240    3.23              陳春燕
## 241    3.44              徐維娟
## 242    3.83              賀安莉
## 243    3.81              陳重仁
## 244    3.21              曾琦智
## 245    3.89              曾琦智
## 246    3.77              王沐嵐
## 247    3.67              朱杰佑
## 248    3.02              何泰鈞
## 249    3.54              梁欣榮
## 250    4.11              奇邁可
## 251    3.61              王寶祥
## 252    3.44              曾琦智
## 253    3.64              朱杰佑
## 254    3.26              曾琦智
## 255    3.75              賀安莉
## 256    3.67              賀安莉
## 257    3.83              鄺慧琪
## 258    3.67              黃恆綜
## 259    3.67              奚永慧
## 260    3.77              馬耀民
## 261    3.80              馬耀民
## 262    3.58              湯麗明
## 263    3.93              吳敏嘉
## 264    3.81              蔡自青
## 265    3.85              蔣希敏
## 266    3.97              蔡自青
## 267    3.55              蔡毓芬
## 268    3.83              張裕敏
## 269    3.89              郭恬君
## 270    3.73              張嘉倩
## 271    3.49              張惠娟
## 272    3.85              許文僊
## 273    3.92              高照明
## 274    3.82              許文僊
## 275    3.65              黃宗慧
## 276    3.69              吳雅鳳
## 277    3.29              沈曉茵
## 278    3.59              王珊珊
## 279    3.31              李紀舍
## 280    3.77                    
## 281    4.30              周婉窈
## 282    4.06              陳翠蓮
## 283    4.15              張嘉鳳
## 284    4.00              陳慧宏
## 285    4.00              閻鴻中
## 286    2.67              羅士傑
## 287    3.55              劉巧楣
## 288    3.20              王遠義
## 289    3.27              呂世浩
## 290    3.90              閻鴻中
## 291    2.79              張嘉鳳
## 292    3.57              古偉瀛
## 293    3.46              甘懷真
## 294    3.51              歐素瑛
## 295    3.52              李文良
## 296    3.15              童長義
## 297    3.91              衣若蘭
## 298    2.47              童長義
## 299    3.15              陳俊強
## 300    3.43              王遠義
## 301    3.40              歐素瑛
## 302    3.48              秦曼儀
## 303    3.49              陳翠蓮
## 304    3.31                張元
## 305    3.55              顏杏如
## 306    3.56              羅士傑
## 307    3.18              楊典錕
## 308    3.26              楊典錕
## 309    4.00              陳平坤
## 310    3.59              陳榮華
## 311    3.08              王榮麟
## 312    3.36              彭文本
## 313    3.27              徐學庸
## 314    3.27              楊植勝
## 315    3.52              苑舉正
## 316    3.41              彭孟堯
## 317    3.23              曾漢塘
## 318    3.11              林明照
## 319    3.11              魏家豪
## 320    3.52              林明照
## 321    3.25              陳榮華
## 322    3.50              孫效智
## 323    3.24              楊植勝
## 324    3.45              李賢中
## 325    3.27              彭文本
## 326    3.75              魏家豪
## 327    2.80              彭孟堯
## 328    3.59              鄧敦民
## 329    3.16                文哲
## 330    3.72              羅素玫
## 331    3.37              王梅霞
## 332    3.42              江芝華
## 333    3.82              蕭婉思
## 334    3.82              李乃欣
## 335    3.09              陳瑪玲
## 336    3.77              王梅霞
## 337    3.71              胡家瑜
## 338    3.43              羅素玫
## 339    3.88              陳有貝
## 340    3.65              陳有貝
## 341    3.78                高德
## 342    3.18              童元昭
## 343    3.29              呂欣怡
## 344    3.77              陳東和
## 345    3.74              顏學誠
## 346    3.23              林開世
## 347    2.89              童元昭
## 348    3.47              黃慕萱
## 349    4.10              朱則剛
## 350    3.51              陳書梅
## 351    3.62              楊東謀
## 352    3.62              藍文欽
## 353    3.98              蔡天怡
## 354    3.58              張郁蔚
## 355    3.64              張郁蔚
## 356    3.85              蔡天怡
## 357    4.00                    
## 358    4.00                    
## 359    4.30                    
## 360    4.30                    
## 361    4.30                    
## 362    4.30                    
## 363    4.15                    
## 364    4.12                    
## 365    4.26                    
## 366    4.25                    
## 367    4.15                    
## 368    3.86                    
## 369    4.12                    
## 370    4.10                    
## 371    4.15                    
## 372    3.74              廖又生
## 373    3.76              廖又生
## 374    3.92              林奇秀
## 375    3.86              林奇秀
## 376    3.97              劉鳳芯
## 377    4.11              蔡天怡
## 378    3.10              林立萍
## 379    3.69              范淑文
## 380    3.99        <U+8FBB>明壽
## 381    4.00            服部美貴
## 382    3.78              洪瑟君
## 383    3.93              朱秋而
## 384    3.88              林慧君
## 385    3.98              曹景惠
## 386    3.81              黃鈺涵
## 387    3.34              林立萍
## 388    3.82            石川隆男
## 389    3.65              林慧君
## 390    3.61              黃鈺涵
## 391    3.86        <U+8FBB>明壽
## 392    3.83            石川隆男
## 393    3.77            服部美貴
## 394    3.38              黃鴻信
## 395    3.82            石川隆男
## 396    3.84            服部美貴
## 397    3.70        <U+8FBB>明壽
## 398    3.90              陳明姿
## 399    3.49              徐興慶
## 400    3.45              曹景惠
## 401    3.67              林立萍
## 402    3.18              詹兆雯
## 403    3.35          星野風紗子
## 404    3.47              柯惠真
## 405    3.63              王芳佳
## 406    3.66              李欣倫
## 407    3.45              詹兆雯
## 408    3.82              賴建樺
## 409    3.59              李芸蓁
## 410    3.39              王芳佳
## 411    3.55              許惠晴
## 412    3.59              洪瑟君
## 413    3.44              許惠晴
## 414    3.36              李欣倫
## 415    3.76              林科成
## 416    3.56              李芸蓁
## 417    3.44        施姵<U+4F03>
## 418    3.60              林姿妙
## 419    3.57              柯惠真
## 420    3.52              王芳佳
## 421    3.40              林芬蓉
## 422    3.33              洪淑娟
## 423    3.48              洪淑娟
## 424    3.51              黃佳鈴
## 425    3.57              黃佳鈴
## 426    3.54              王芳佳
## 427    3.52              江佩璇
## 428    3.49              江佩璇
## 429    3.57              彭誼芝
## 430    3.54              林科成
## 431    3.17              林姿妙
## 432    3.43              黃佳鈴
## 433    3.72              張鈞竹
## 434    3.70            池田晶子
## 435    3.52              彭誼芝
## 436    3.72            池田晶子
## 437    3.60              賴建樺
## 438    3.52              黃意婷
## 439    3.74              彭誼芝
## 440    3.48              賴建樺
## 441    3.65              林科成
## 442    3.65              黃意婷
## 443    3.53              彭誼芝
## 444    3.71              張鈞竹
## 445    3.54              李欣倫
## 446    3.37              李芸蓁
## 447    3.49              林芬蓉
## 448    3.54              李芸蓁
## 449    3.49              李芸蓁
## 450    3.67        施姵<U+4F03>
## 451    3.54              江佩璇
## 452    3.52              賴建樺
## 453    3.42              林慧君
## 454    3.59              陳明姿
## 455    3.40              洪瑟君
## 456    3.90            服部美貴
## 457    3.75        <U+8FBB>明壽
## 458    3.80            石川隆男
## 459    3.57      <U+8FBB>本雅史
## 460    3.51              朱秋而
## 461    3.83        <U+8FBB>明壽
## 462    3.68      <U+8FBB>本雅史
## 463    4.03            服部美貴
## 464    3.50      <U+8FBB>本雅史
## 465    3.92              許惠晴
## 466    3.45              黃佳鈴
## 467    3.62              黃佳鈴
## 468    3.57              許惠晴
## 469    3.76              林科成
## 470    3.82              柯惠真
## 471    3.54        施姵<U+4F03>
## 472    3.79              林芬蓉
## 473    3.81            池田晶子
## 474    3.54              王芳佳
## 475    3.69              柯惠真
## 476    3.62              林姿妙
## 477    3.64              張鈞竹
## 478    3.56          星野風紗子
## 479    3.74              張鈞竹
## 480    3.70              洪淑娟
## 481    3.62              林姿妙
## 482    3.76          星野風紗子
## 483    3.80              江佩璇
## 484    3.79              黃意婷
## 485    3.60              黃意婷
## 486    3.50              詹兆雯
## 487    3.58              詹兆雯
## 488    3.42              洪淑娟
## 489    3.53              林芬蓉
## 490    3.65              李欣倫
## 491    3.35              范淑文
## 492    3.75            石川隆男
## 493    3.77              范淑文
## 494    3.77              朱秋而
## 495    3.24              徐興慶
## 496    3.80              曹景惠
## 497    3.61              黃鈺涵
## 498    3.72              李承珍
## 499    3.67              李相美
## 500    3.88              李相美
## 501    3.43              李承珍
## 502    3.88              裴英姬
## 503    3.95              阮蓮香
## 504    3.59              劉康定
## 505    3.49              劉康定
## 506    2.75              于柏桂
## 507    3.82              王麗蘭
## 508    3.69              王麗蘭
## 509    3.86              李相美
## 510    3.82              李承珍
## 511    4.14              阮蓮香
## 512    4.00              劉康定
## 513    4.11              王麗蘭
## 514    3.25          星野風紗子
## 515    3.65              黃意婷
## 516    3.33            池田晶子
## 517    3.30              許惠晴
## 518    3.56              柯惠真
## 519    3.55              張鈞竹
## 520    3.52              洪瑟君
## 521    3.67              詹兆雯
## 522    3.67              謝筱玫
## 523    3.53              劉達倫
## 524    3.00              林智莉
## 525    3.60              朱靜美
## 526    3.49              朱靜美
## 527    3.33              姚坤君
## 528    3.31              姚坤君
## 529    4.04              鍾幸玲
## 530    3.76              駱麗真
## 531    3.93              駱麗真
## 532    3.73              廖偉民
## 533    3.56              傅銘傳
## 534    2.87              謝筱玫
## 535    3.36              王安祈
## 536    3.75              呂柏伸
## 537    3.53              呂柏伸
## 538    3.44              劉達倫
## 539    3.39              劉權富
## 540    3.07              劉權富
## 541    3.45              林祺成
## 542    3.44              林祺成
## 543    3.76              陳建騏
## 544    3.05              范朝煒
## 545    2.39              林于湘
## 546    2.92              沈惠如
## 547    3.94              林祺成
## 548    3.93              符宏征
## 549    3.62              姚坤君
## 550    3.91              符宏征
## 551    3.65              劉權富
## 552    3.50              李柏霖
## 553    0.64                    
## 554    1.29                    
## 555    3.94              黃沛榮
## 556    4.30              張寶三
## 557    4.30              何寄澎
## 558    4.18              李隆獻
## 559    4.30              葉國良
## 560    4.30              張蓓蓓
## 561    4.15              鄭毓瑜
## 562    4.30              梅家玲
## 563    4.15              陳昭瑛
## 564    4.22              李存智
## 565    4.30              伍振勳
## 566    4.03              周志文
## 567    3.96              洪淑苓
## 568    0.32                    
## 569    1.49                    
## 570    3.90              王沐嵐
## 571    3.99              柏逸嘉
## 572    2.96              李鴻瓊
## 573    4.03              高維泓
## 574    3.68              張淑英
## 575    3.75              沈志中
## 576    4.21                簡潔
## 577    3.83              馬耀民
## 578    3.80              鮑曉鷗
## 579    3.96              鮑曉鷗
## 580    0.45                    
## 581    1.59                    
## 582    3.98        楊肅<U+732E>
## 583    4.24              甘懷真
## 584    4.17              王世宗
## 585    4.22              陳弱水
## 586    4.19              周婉窈
## 587    4.16              李文良
## 588    4.21              呂紹理
## 589    4.17              陳翠蓮
## 590    4.11              張嘉鳳
## 591    4.07              陳國棟
## 592    4.18              王遠義
## 593    4.11              衣若蘭
## 594    3.47              閻鴻中
## 595    4.06              宋家復
## 596    4.22              顏杏如
## 597    4.00              羅士傑
## 598    3.75              方震華
## 599    3.58              宋家復
## 600    4.14              周婉窈
## 601    3.77              吳密察
## 602    4.00              甘懷真
## 603    3.71              陳國棟
## 604    3.58              鍾淑敏
## 605    3.44              宋家復
## 606    3.79              李仁淵
## 607    3.83              吳密察
## 608    4.11              王世宗
## 609    3.77              陳弱水
## 610    3.56              李文良
## 611    4.06              謝金蓉
## 612    3.98              楊典錕
## 613    0.38                    
## 614    3.84            佐藤將之
## 615    2.09                    
## 616    3.91              魏家豪
## 617    4.09              林明照
## 618    3.97              劉貴傑
## 619    4.05              陳平坤
## 620    4.10              楊金穆
## 621    3.94              鄧敦民
## 622    3.80              王榮麟
## 623    3.14                文哲
## 624    4.15              楊金穆
## 625    0.50                    
## 626    3.50                高德
## 627    1.70                    
## 628    4.13              王梅霞
## 629    4.09              呂欣怡
## 630    4.04              林開世
## 631    4.06              陳瑪玲
## 632    3.65              陳有貝
## 633    3.82              陳瑪玲
## 634    3.78              呂欣怡
## 635    2.77              江芝華
## 636    3.45              陳其南
## 637    1.50              陳雪華
## 638    0.28              黃慕萱
## 639    0.83                    
## 640    1.14              林珊如
## 641    0.00                    
## 642    0.00              謝寶煖
## 643     NaN                    
## 644    4.00                    
## 645    4.06                    
## 646    4.00                    
## 647    4.00                    
## 648    4.10                    
## 649    3.70                    
## 650    4.30                    
## 651    4.00                    
## 652    4.13                    
## 653    4.00                    
## 654    3.70                    
## 655    3.87                    
## 656    4.00              陳書梅
## 657    4.00              林珊如
## 658    1.92              陳雪華
## 659    1.04              黃慕萱
## 660    1.05              朱則剛
## 661    1.74              林珊如
## 662    1.21              陳光華
## 663    1.08              陳書梅
## 664    1.32              謝寶煖
## 665    0.96              唐牧群
## 666    0.60              林奇秀
## 667    1.51              藍文欽
## 668    1.09              林維真
## 669    0.91              楊東謀
## 670    3.96              陳光華
## 671    4.30                    
## 672    4.00                    
## 673    4.00                    
## 674    4.06                    
## 675    3.88                    
## 676    4.00                    
## 677    4.00                    
## 678    3.93                    
## 679    4.30                    
## 680    4.15                    
## 681    4.15                    
## 682    4.30                    
## 683    3.70                    
## 684    4.00                    
## 685    3.70                    
## 686    4.10                    
## 687    4.00                    
## 688    3.70              藍文欽
## 689    3.86              林珊如
## 690    3.87              林維真
## 691    3.74              藍文欽
## 692    3.80              吳可久
## 693    3.89              黃慕萱
## 694    3.89              陳書梅
## 695    3.80              唐牧群
## 696    3.84              林維真
## 697    3.48              楊東謀
## 698    0.98                    
## 699    3.90              陳明姿
## 700    3.00              曹景惠
## 701    3.82              范淑文
## 702    4.13              黃鴻信
## 703    4.14              林慧君
## 704    4.14              林立萍
## 705    3.91              徐興慶
## 706    3.71      <U+8FBB>本雅史
## 707    4.13              何思慎
## 708    1.30                    
## 709    3.70              王安祈
## 710    3.78              呂柏伸
## 711    3.56              謝筱玫
## 712    3.53              紀蔚然
## 713    3.76              姚坤君
## 714    3.76              劉權富
## 715    3.05              范朝煒
## 716    3.10        <U+5742>井隆
## 717    3.68              施靜菲
## 718    0.55                    
## 719    1.26                    
## 720    3.79              劉巧楣
## 721    3.75              盧慧紋
## 722    3.88              施靜菲
## 723    3.31        <U+5742>井隆
## 724    3.84              黃蘭翔
## 725    0.45                    
## 726    1.44                    
## 727    3.80              宋麗梅
## 728    3.83              邱振豪
## 729    3.87              馮怡蓁
## 730    4.10              謝舒凱
## 731    4.18              宋麗梅
## 732    4.07              呂佳蓉
## 733    3.86              江文瑜
## 734    4.05              謝舒凱
## 735    3.46              陳峙維
## 736    3.52              李孔元
## 737    1.38                    
## 738    3.71                沈冬
## 739    3.76              王育雯
## 740    3.71              楊建章
## 741    3.53              陳峙維
## 742    3.76              楊建章
## 743    3.55              蔡振家
## 744    3.98            山內文登
## 745    3.72                    
## 746    0.00                    
## 747    1.55                    
## 748    3.74              張俐璇
## 749    3.89              黃美娥
## 750    4.02              洪淑苓
## 751    3.94              蘇碩斌
## 752    4.00              張文薰
## 753    4.30              蘇碩斌
## 754    3.86              柯慶明
## 755    3.68              黃美娥
## 756    3.54              張文薰
## 757    3.51              蘇碩斌
## 758    0.41                    
## 759    3.85              邱力璟
## 760    4.07              劉德馨
## 761    4.02              劉德馨
## 762    3.97              蔡宜妮
## 763    3.98              林均芳
## 764    3.70              郭思吟
## 765    4.00              陳玟妤
## 766    3.79              賴紋萱
## 767    3.92              駱美秀
## 768    3.64              吳艾芸
## 769    4.12              薛涵方
## 770    3.92              劉士菁
## 771    2.97              許敏淑
## 772    3.52              蔡孟芳
## 773    3.54              吳艾芸
## 774    3.36              許淑婷
## 775    4.20              劉士菁
## 776    3.49              陳伯嫚
## 777    3.78              郭思吟
## 778    4.10              邱顯哲
## 779    4.14              吳俞萱
## 780    3.37              張雅惠
## 781    3.96              高幼蘋
## 782    3.12              劉士菁
## 783    3.47              薛涵方
## 784    2.46              許筑琴
## 785    3.19              蔡孟芳
## 786    3.51              陳玟妤
## 787    3.57              洪塘忻
## 788    3.69              高幼蘋
## 789    0.67                    
## 790    3.82              石岱崙
## 791    4.02              石岱崙
## 792    4.30              蔡毓芬
## 793    3.65              馬耀民
## 794    3.58              高照明
## 795    4.00              趙恬儀
## 796    4.30              馬耀民
## 797    4.20              趙恬儀
## 798    4.04              吳敏嘉
## 799    4.00              范家銘
## 800    4.15              郭恬君
## 801    4.00              蔡毓芬
## 802    4.00                    
## 803    3.78              陳仕芸
## 804    2.80              蔡雅如
## 805    2.61              李國瑋
## 806    2.55              張瑞恩
## 807    2.49              黃項平
## 808    2.46              賴青瑞
## 809    2.71              賴青瑞
## 810    2.64              周謀鴻
## 811    2.71              莊正良
## 812    2.62              崔茂培
## 813    2.70              張志中
## 814    2.51              蔡雅如
## 815    2.51              劉瓊如
## 816    2.61              蔡宜洵
## 817    2.49              陳榮凱
## 818    2.71              黃志強
## 819    2.65              官彥良
## 820    2.63              楊策仲
## 821    2.94              翁秉仁
## 822    2.73              李秋坤
## 823    2.66              呂楊凱
## 824    2.77              張樹城
## 825    2.82              洪立昌
## 826    2.49              陳志偉
## 827    2.34              翁秉仁
## 828    2.45              李聰成
## 829    2.66              鄭明燕
## 830    3.96                    
## 831    3.23              王名儒
## 832    2.97              石明豐
## 833    3.09              張寶棣
## 834    2.62                趙元
## 835    2.49              陳育霖
## 836    3.23              洪銘輝
## 837    2.81              易富國
## 838    3.04              杜其永
## 839    2.69              趙治宇
## 840    3.08              陳凱風
## 841    3.22              李文忠
## 842    2.89              李慶德
## 843    2.90              邱雅萍
## 844    2.91              陳俊瑋
## 845    3.21              張顏暉
## 846    3.23              高英哲
## 847    2.42              蔡爾成
## 848    2.76              胡崇德
## 849    2.65              王建萬
## 850    3.45              朱士維
## 851    2.94              陳育霖
## 852    2.74              曾詣涵
## 853    2.53              陳凱風
## 854    2.50              陳俊瑋
## 855    3.56              王名儒
## 856    3.79              石明豐
## 857    3.61              張寶棣
## 858    3.60              蔡政達
## 859    3.53              王立民
## 860    3.40              朱士維
## 861    3.47              趙治宇
## 862    3.78              陳凱風
## 863    3.68              蔡爾成
## 864    3.91              陳育霖
## 865    3.57              邱雅萍
## 866    3.52              陳俊瑋
## 867    3.56              蔡爾成
## 868    3.47              張慶瑞
## 869    3.29              龐寧寧
## 870    3.69              洪銘輝
## 871    3.43              王立民
## 872    3.43              陳育霖
## 873    3.53              梁啟德
## 874    3.29              梁啟德
## 875    3.40              張顏暉
## 876    3.04              黃偉彥
## 877    3.04              趙挺偉
## 878    2.80              蔡爾成
## 879    3.34              朱士維
## 880    4.01              朱士維
## 881    2.83              龐寧寧
## 882    3.15            細道和夫
## 883    2.83              高涌泉
## 884    3.83              梁啟德
## 885    3.83              梁啟德
## 886    2.51              石明豐
## 887    3.52              孫維新
## 888    3.14              彭旭明
## 889    2.89              鄭淑芬
## 890    2.85              劉銘璋
## 891    2.80              蔡蘊明
## 892    2.51              佘瑞琳
## 893    2.62              金必耀
## 894    2.84              李弘文
## 895    2.96              邱靜雯
## 896    3.45              佘瑞琳
## 897    3.50              彭旭明
## 898    3.39              佘瑞琳
## 899    3.47              李弘文
## 900    3.44              金必耀
## 901    3.61              江建文
## 902    3.65              牟中原
## 903    3.49              邱靜雯
## 904    3.50              江建文
## 905    3.55              陳浩銘
## 906    3.62              劉如熹
## 907    3.54              佘瑞琳
## 908    3.57              江建文
## 909    3.55              佘瑞琳
## 910    3.49              邱靜雯
## 911    3.58              佘瑞琳
## 912    3.59              彭旭明
## 913    3.64              佘瑞琳
## 914    2.77              何佳安
## 915    2.69              張煥宗
## 916    2.84              陳俊顯
## 917    3.62              徐丞志
## 918    3.59              林金全
## 919    3.56              廖尉斯
## 920    3.62              陸駿逸
## 921    3.53              徐丞志
## 922    3.79              徐丞志
## 923    3.63              徐丞志
## 924    2.52              詹益慈
## 925    2.47              方俊民
## 926    2.55              劉緒宗
## 927    2.56              陳昭岑
## 928    2.65              王宗興
## 929    3.02                陳平
## 930    2.91              邱勝賢
## 931    2.58              羅禮強
## 932    3.59              王宗興
## 933    3.78              廖尉斯
## 934    3.60              陳俊顯
## 935    3.65              羅禮強
## 936    3.56              詹益慈
## 937    3.57              詹益慈
## 938    3.45              詹益慈
## 939    3.70              楊吉水
## 940    3.46              楊吉水
## 941    3.41              劉緒宗
## 942    3.61              戴桓青
## 943    3.66              牟中原
## 944    3.51              牟中原
## 945    3.72              羅禮強
## 946    3.75              楊吉水
## 947    3.47              劉緒宗
## 948    3.73                陳平
## 949    3.59              邱勝賢
## 950    3.63              羅禮強
## 951    3.61              汪根欉
## 952    3.65                陳平
## 953    3.68              汪根欉
## 954    2.75              張大釗
## 955    2.86              周必泰
## 956    2.91              陳振中
## 957    3.69              陳振中
## 958    3.68              陸駿逸
## 959    3.69              陳逸聰
## 960    3.76              周必泰
## 961    3.45              牟中原
## 962    2.85              江建文
## 963    4.04              陳逸聰
## 964    3.64              鄭原忠
## 965    3.77                陳平
## 966    3.61              徐丞志
## 967    3.68              鄭淑芬
## 968    3.72              汪根欉
## 969    3.65              廖尉斯
## 970    3.78              楊吉水
## 971    3.64              戴桓青
## 972    3.65              陳逸聰
## 973    4.00              林金全
## 974    4.00              方俊民
## 975    4.08              鄭淑芬
## 976    3.94              劉如熹
## 977    4.30              金必耀
## 978    4.00              陳昭岑
## 979    4.00              邱勝賢
## 980    4.00              楊吉水
## 981    4.18              陳俊顯
## 982    4.17              李弘文
## 983    4.00                陳平
## 984    4.00              戴桓青
## 985    4.30              詹益慈
## 986    4.20              林金全
## 987    4.15              方俊民
## 988    4.15              鄭淑芬
## 989    3.94              劉如熹
## 990    4.30              金必耀
## 991    4.00              陳昭岑
## 992    4.00              陳俊顯
## 993    4.15              李弘文
## 994    4.00                陳平
## 995    4.00              戴桓青
## 996    4.30              詹益慈
## 997    3.87              徐澔德
## 998    3.71              宋聖榮
## 999    3.76              劉雅瑄
## 1000   3.80              劉雅瑄
## 1001   3.80              胡植慶
## 1002   3.74              盧佳遇
## 1003   3.69              宋聖榮
## 1004   3.86              林日白
## 1005   3.62              李紅春
## 1006   3.73              鄧屬予
## 1007   3.74              陳于高
## 1008   3.76              鄧茂華
## 1009   3.77              沈川洲
## 1010   3.71              劉雅瑄
## 1011   3.75              林日白
## 1012   3.70              魏國彥
## 1013   3.73              施路易
## 1014   3.43              宋聖榮
## 1015   3.24              胡植慶
## 1016   3.54              陳文山
## 1017   3.94              盧佳遇
## 1018   3.84              宋聖榮
## 1019   4.13              徐澔德
## 1020   4.14                    
## 1021   3.19              曾泰琳
## 1022   3.03              鄧屬予
## 1023   3.88              鄧屬予
## 1024   2.65              洪淑蕙
## 1025   3.34              劉雅瑄
## 1026   3.54              吳逸民
## 1027   3.51              任昊佳
## 1028   3.29              盧佳遇
## 1029   4.30              陳宏宇
## 1030   3.70              魏國彥
## 1031   4.15              陳于高
## 1032   4.00              洪淑蕙
## 1033   3.97              胡植慶
## 1034   3.70              沈川洲
## 1035   4.00              吳逸民
## 1036   4.30              龔源成
## 1037   4.08              林立虹
## 1038   4.30              施路易
## 1039   4.15              徐澔德
## 1040   3.50              李紅春
## 1041   4.00              任昊佳
## 1042   3.70              林日白
## 1043   3.77              李紅春
## 1044   3.32              胡志偉
## 1045   3.30              黃從仁
## 1046   3.48              郭柏呈
## 1047   3.41              徐永豐
## 1048   3.37              周泰立
## 1049   3.14              連韻文
## 1050   3.14              趙儀珊
## 1051   3.55              張仁和
## 1052   3.05              朱傚祖
## 1053   3.49              莊振義
## 1054   3.30              莊振義
## 1055   2.82              溫在弘
## 1056   3.02              黃誌川
## 1057   3.66              李建堂
## 1058   3.23              黃倬英
## 1059   4.00              林楨家
## 1060   3.53              蔡博文
## 1061   4.30              黃倬英
## 1062   3.35              黃誌川
## 1063   2.15              洪廣冀
## 1064   3.83              溫在弘
## 1065   3.05              洪廣冀
## 1066   2.99              陳維婷
## 1067   2.53              徐光蓉
## 1068   3.13              吳明進
## 1069   3.34              楊明仁
## 1070   3.50              羅敏輝
## 1071   2.67              蔡天鉞
## 1072   3.02              吳俊傑
## 1073   3.06              游政谷
## 1074   3.19              陳正平
## 1075   3.35              陳世楠
## 1076   3.60              游政谷
## 1077   3.88              羅敏輝
## 1078   4.00              吳健銘
## 1079   0.93                    
## 1080   2.15                    
## 1081   3.36              夏俊雄
## 1082   3.92              薛克民
## 1083   2.99                陳宏
## 1084   3.23              劉豐哲
## 1085   3.70              馬梓銘
## 1086   3.69              姜祖恕
## 1087   3.63              賴青瑞
## 1088   3.76              林太家
## 1089   3.33              王振男
## 1090   3.90              韓傳祥
## 1091   3.99              薛克民
## 1092   2.89              陳君明
## 1093   3.76              林太家
## 1094   3.15              謝天長
## 1095   3.36              江金倉
## 1096   0.73                    
## 1097   4.18              洪銘輝
## 1098   3.81              朱國瑞
## 1099   4.10              闕志鴻
## 1100   4.06              陳義裕
## 1101   4.04              王名儒
## 1102   3.91              郭光宇
## 1103   4.22              賀培銘
## 1104   4.09              陳永芳
## 1105   4.17              陳政維
## 1106   4.30              張寶棣
## 1107   4.12              張顏暉
## 1108   4.28              梁啟德
## 1109   4.03              張慶瑞
## 1110   4.17              蔡定平
## 1111   4.30              吳俊輝
## 1112   4.30              趙治宇
## 1113   4.30                熊怡
## 1114   4.19              林敏聰
## 1115   4.14              管希聖
## 1116   4.13              朱士維
## 1117   3.43              朱時宜
## 1118   4.30              陳凱風
## 1119   3.78              王立民
## 1120   3.92                熊怡
## 1121   3.60              朱國瑞
## 1122   3.17              黃偉彥
## 1123   3.50              陳恒榆
## 1124   3.40              陳智泓
## 1125   4.00              高英哲
## 1126   3.57              管希聖
## 1127   4.11              蔡定平
## 1128   3.83              林敏聰
## 1129   3.65              林敏聰
## 1130   3.85              張嘉升
## 1131   3.40              周美吟
## 1132   4.15              張嘉升
## 1133   3.63              張嘉升
## 1134   3.67              張嘉升
## 1135   3.60              張嘉升
## 1136   2.14                    
## 1137   3.96              洪銘輝
## 1138   3.94              朱國瑞
## 1139   4.00              闕志鴻
## 1140   4.23              陳義裕
## 1141   4.09              王名儒
## 1142   3.69              郭光宇
## 1143   4.25              賀培銘
## 1144   3.93              陳永芳
## 1145   4.12              陳政維
## 1146   4.28              張寶棣
## 1147   4.07              張顏暉
## 1148   4.27              梁啟德
## 1149   4.00              張慶瑞
## 1150   4.07              蔡定平
## 1151   4.27              趙治宇
## 1152   3.30                熊怡
## 1153   4.08              林敏聰
## 1154   4.06              管希聖
## 1155   4.02              朱士維
## 1156   3.62              朱時宜
## 1157   4.09              蔡政達
## 1158   3.54              陳智泓
## 1159   4.24              陳凱風
## 1160   3.50              王立民
## 1161   3.69              何小剛
## 1162   2.99              管希聖
## 1163   2.97              賀培銘
## 1164   3.65              林俊達
## 1165   4.03              林敏聰
## 1166   4.19              朱士維
## 1167   4.07              洪銘輝
## 1168   4.06              趙治宇
## 1169   3.96              賀培銘
## 1170   4.08              吳俊輝
## 1171   4.30              蔡政達
## 1172   3.86              陳恒榆
## 1173   3.83              劉國平
## 1174   2.28              陳逸聰
## 1175   3.61              陳逸聰
## 1176   3.95              彭旭明
## 1177   3.99              林金全
## 1178   3.96              牟中原
## 1179   4.01              方俊民
## 1180   3.91              鄭淑芬
## 1181   4.11              劉緒宗
## 1182   3.80              張煥宗
## 1183   3.27              張哲政
## 1184   4.20              梁文傑
## 1185   4.14              劉如熹
## 1186   4.04              周必泰
## 1187   3.93              金必耀
## 1188   4.03              陳昭岑
## 1189   4.00              汪根欉
## 1190   4.12              邱勝賢
## 1191   3.84              陳振中
## 1192   4.11              楊吉水
## 1193   4.17              陳俊顯
## 1194   3.91              鄭原忠
## 1195   3.68              邱靜雯
## 1196   3.94              詹益慈
## 1197   3.90              王宗興
## 1198   4.04              廖尉斯
## 1199   4.08              陳浩銘
## 1200   4.02              徐丞志
## 1201   3.93              翁啟惠
## 1202   4.01              李遠哲
## 1203   4.13              陳長謙
## 1204   4.08              方俊民
## 1205   3.74              張煥宗
## 1206   4.00              陸駿逸
## 1207   4.00              邱勝賢
## 1208   4.15              戴桓青
## 1209   4.12              吳世雄
## 1210   3.95              陳逸聰
## 1211   3.87              彭旭明
## 1212   3.83              牟中原
## 1213   4.13              方俊民
## 1214   3.70              鄭淑芬
## 1215   4.00              劉緒宗
## 1216   3.85              張煥宗
## 1217   4.20              梁文傑
## 1218   4.06              劉如熹
## 1219   4.11              周必泰
## 1220   3.92              金必耀
## 1221   3.96              陳昭岑
## 1222   3.88              汪根欉
## 1223   4.08              邱勝賢
## 1224   3.90              陳振中
## 1225   4.00              陸駿逸
## 1226   4.15              楊吉水
## 1227   3.68              陳俊顯
## 1228   3.97              鄭原忠
## 1229   3.61              邱靜雯
## 1230   4.08              戴桓青
## 1231   4.00              廖尉斯
## 1232   3.48              張煥宗
## 1233   2.61              汪根欉
## 1234   3.08              陳玉如
## 1235   2.80              陳浩銘
## 1236   3.66              林俊宏
## 1237   4.05              陳玉如
## 1238   4.08              陳玉如
## 1239   3.21              戴桓青
## 1240   4.17              戴桓青
## 1241   3.84              戴桓青
## 1242   3.45              陳逸聰
## 1243   3.97              陳逸聰
## 1244   3.89              彭旭明
## 1245   4.10              林金全
## 1246   3.98              牟中原
## 1247   4.09              方俊民
## 1248   3.94              鄭淑芬
## 1249   4.04              劉緒宗
## 1250   4.00              張煥宗
## 1251   3.92              張哲政
## 1252   4.06              梁文傑
## 1253   4.21              劉如熹
## 1254   4.14              周必泰
## 1255   3.84              金必耀
## 1256   4.04              陳昭岑
## 1257   3.95              汪根欉
## 1258   4.06              邱勝賢
## 1259   4.06              陳振中
## 1260   4.05              楊吉水
## 1261   4.11              陳俊顯
## 1262   4.02              李弘文
## 1263   4.00                陳平
## 1264   3.97              鄭原忠
## 1265   3.88              邱靜雯
## 1266   4.10              戴桓青
## 1267   3.93              詹益慈
## 1268   3.74              王宗興
## 1269   3.91              廖尉斯
## 1270   4.06              陳浩銘
## 1271   4.00              江建文
## 1272   4.00              徐丞志
## 1273   3.91              李遠哲
## 1274   3.95              陳仲瑄
## 1275   3.95              林志民
## 1276   4.30              陳玉如
## 1277   4.08              林金全
## 1278   3.88              張煥宗
## 1279   3.75              牟中原
## 1280   3.93              陳昭岑
## 1281   4.00                陳平
## 1282   4.12              陳振中
## 1283   4.14              戴桓青
## 1284   4.08              王宗興
## 1285   3.94              廖尉斯
## 1286   4.25              吳世雄
## 1287   4.08              陳逸聰
## 1288   3.46              張大釗
## 1289   3.95              周必泰
## 1290   4.00              陳玉如
## 1291   3.99              陳逸聰
## 1292   3.85              彭旭明
## 1293   3.94              林金全
## 1294   3.95              牟中原
## 1295   3.92              方俊民
## 1296   3.91              鄭淑芬
## 1297   3.96              劉緒宗
## 1298   3.91              張煥宗
## 1299   3.95              張哲政
## 1300   4.18              梁文傑
## 1301   4.06              劉如熹
## 1302   4.14              周必泰
## 1303   3.80              金必耀
## 1304   3.96              陳昭岑
## 1305   3.91              汪根欉
## 1306   3.98              邱勝賢
## 1307   4.03              陳振中
## 1308   4.04              楊吉水
## 1309   3.97              陳俊顯
## 1310   3.94              李弘文
## 1311   4.00                陳平
## 1312   3.97              鄭原忠
## 1313   3.83              邱靜雯
## 1314   4.06              戴桓青
## 1315   4.02              詹益慈
## 1316   4.06              王宗興
## 1317   3.87              廖尉斯
## 1318   4.00              陳浩銘
## 1319   3.64              張煥宗
## 1320   3.44              汪根欉
## 1321   3.53              陳玉如
## 1322   3.52              陳浩銘
## 1323   3.59              林俊宏
## 1324   3.16              林金全
## 1325   3.64              陳錦明
## 1326   3.30              戴桓青
## 1327   3.09              劉如熹
## 1328   3.71              鄭原忠
## 1329   3.62              陳仲瑄
## 1330   3.81              林俊宏
## 1331   3.38              彭旭明
## 1332   0.61                    
## 1333   4.01              林日白
## 1334   4.00              吳逸民
## 1335   4.30              沈川洲
## 1336   3.94              陳于高
## 1337   4.05              吳逸民
## 1338   4.06              沈川洲
## 1339   3.48              鄧屬予
## 1340   4.12              鄧屬予
## 1341   4.17              盧佳遇
## 1342   3.96              沈川洲
## 1343   3.92              魏國彥
## 1344   3.78              洪淑蕙
## 1345   3.14              陳宏宇
## 1346   3.95              林淑芬
## 1347   4.00              徐澔德
## 1348   3.86              吳逸民
## 1349   3.69              龔源成
## 1350   3.77              魏國彥
## 1351   3.88              林立虹
## 1352   0.94                    
## 1353   3.99        黃<U+56C7>莉
## 1354   4.30              周泰立
## 1355   4.30              郭柏呈
## 1356   4.12              林耀盛
## 1357   2.19                    
## 1358   3.80              郭柏呈
## 1359   3.52              翁儷禎
## 1360   4.04              張素凰
## 1361   4.10              吳宗祐
## 1362   4.00              鄭伯壎
## 1363   4.06              黃光國
## 1364   3.46              葉光輝
## 1365   3.86              葉素玲
## 1366   4.04              陳淑惠
## 1367   3.82              張素凰
## 1368   3.88              張素凰
## 1369   3.96              林耀盛
## 1370   3.90              張玉玲
## 1371   4.15              張玉玲
## 1372   4.04              陳淑惠
## 1373   3.85              張玉玲
## 1374   4.15              翁儷禎
## 1375   3.82              連韻文
## 1376   3.84              賴文崧
## 1377   3.46              葉素玲
## 1378   3.92              胡志偉
## 1379   3.86              賴文崧
## 1380   3.15              張玉玲
## 1381   3.85              葉素玲
## 1382   4.09              葉怡玉
## 1383   4.24              葉俊毅
## 1384   3.50              陳建中
## 1385   0.62                    
## 1386   3.64              周素卿
## 1387   3.76              周素卿
## 1388   3.88              周素卿
## 1389   4.06              周素卿
## 1390   2.58                    
## 1391   3.52              周素卿
## 1392   3.55              洪廣冀
## 1393   3.85              林楨家
## 1394   3.45              溫在弘
## 1395   3.99              蔡博文
## 1396   3.38              徐進鈺
## 1397   3.80              簡旭伸
## 1398   3.56              黃誌川
## 1399   3.77              朱子豪
## 1400   3.95              李美慧
## 1401   3.97              蔡博文
## 1402   3.94              林楨家
## 1403   3.63              朱子豪
## 1404   3.83              李美慧
## 1405   0.80              林依依
## 1406   3.87              黃彥婷
## 1407   3.91              羅敏輝
## 1408   4.15              隋中興
## 1409   2.52              林依依
## 1410   3.70              隋中興
## 1411   3.51              吳健銘
## 1412   4.05              游政谷
## 1413   4.00              陳維婷
## 1414   4.01              林博雄
## 1415   3.82              李清勝
## 1416   4.10              楊明仁
## 1417   3.21              徐光蓉
## 1418   3.55              林博雄
## 1419   4.00              郭鴻基
## 1420   3.93              洪惠敏
## 1421   4.15              洪惠敏
## 1422   0.65                    
## 1423   3.54              陳韋仁
## 1424   3.71              王珮玲
## 1425   4.00                詹森
## 1426   1.84                    
## 1427   3.66              陳世楠
## 1428   3.85              蕭仁傑
## 1429   3.50              王珮玲
## 1430   3.79              魏志潾
## 1431   3.51        <U+6E29>良碩
## 1432   3.71                詹森
## 1433   3.57              魏慶琳
## 1434   3.56        <U+6E29>良碩
## 1435   3.67              謝文陽
## 1436   4.00              謝文陽
## 1437   3.49              宋國士
## 1438   3.82              蘇志杰
## 1439   3.79        <U+6E29>良碩
## 1440   3.92              林卉婷
## 1441   3.70              王珮玲
## 1442   3.92              劉家瑄
## 1443   3.82        <U+6E29>良碩
## 1444   3.57              陳昭倫
## 1445   3.86              蘇志杰
## 1446   3.66              蘇志杰
## 1447   3.70              王珮玲
## 1448   3.91              林曉武
## 1449   3.90              蕭仁傑
## 1450   3.88              戴昌鳳
## 1451   3.92              三木健
## 1452   3.91              陳勁吾
## 1453   3.32              宋國士
## 1454   3.47              楊穎堅
## 1455   3.50              楊穎堅
## 1456   3.40              林曉武
## 1457   3.46              楊穎堅
## 1458   3.50              蕭仁傑
## 1459   3.11              陳世楠
## 1460   3.91              張翠玉
## 1461   3.68              蕭仁傑
## 1462   4.15              曾鈞懋
## 1463   4.05              謝志豪
## 1464   3.05              黃千芬
## 1465   3.64              戴昌鳳
## 1466   3.19              三木健
## 1467   3.92              謝志豪
## 1468   3.49              三木健
## 1469   0.42                    
## 1470   4.02              陳丕燊
## 1471   4.00              闕志鴻
## 1472   3.53              吳俊輝
## 1473   4.26              吳俊輝
## 1474   3.34              何小剛
## 1475   3.11              王名儒
## 1476   1.64                    
## 1477   3.93              陳丕燊
## 1478   3.60              何小剛
## 1479   2.95              闕志鴻
## 1480   1.47                    
## 1481   4.04              張寶棣
## 1482   2.28                    
## 1483   3.67              何小剛
## 1484   3.92              黃斯衍
## 1485   3.53              黃凱苹
## 1486   3.38              黃長玲
## 1487   3.25              王業立
## 1488   3.50              張亞中
## 1489   3.08              明居正
## 1490   3.63              張登及
## 1491   3.51              蘇彩足
## 1492   3.56              洪美仁
## 1493   3.75              黃長玲
## 1494   3.27              黃心怡
## 1495   2.92              湯德宗
## 1496   2.90              蔡季廷
## 1497   3.13              陳淳文
## 1498   3.39              葛永光
## 1499   3.85              李鳳玉
## 1500   3.56              張佑宗
## 1501   3.02              許誠哲
## 1502   3.74              林俊宏
## 1503   3.49              李鳳玉
## 1504   3.32              黃旻華
## 1505   3.51              郭乃菱
## 1506   3.34              陳思賢
## 1507   3.22              黃凱苹
## 1508   3.55              黃心怡
## 1509   3.48              吳玉山
## 1510   3.67              彭錦鵬
## 1511   3.29              盧瑞鍾
## 1512   3.71              林俊宏
## 1513   3.86              蘇彩足
## 1514   3.48              童涵浦
## 1515   3.88              吳若予
## 1516   3.48              陳思賢
## 1517   3.42              蔡季廷
## 1518   3.03              徐斯勤
## 1519   3.70              陳世民
## 1520   3.77              郭銘峰
## 1521   3.63              楊承達
## 1522   3.96              朱浤源
## 1523   3.60              張登及
## 1524   3.60              陳世民
## 1525   3.31              黃錦堂
## 1526   3.77              蘇宏達
## 1527   3.56              左正東
## 1528   2.76              徐斯勤
## 1529   3.22              李錫錕
## 1530   3.31              嚴震生
## 1531   2.82              吳聰敏
## 1532   3.17              駱明慶
## 1533   3.21              陳旭昇
## 1534   3.30              林明仁
## 1535   3.18              魏凱立
## 1536   3.28              黃詩淳
## 1537   3.52              魏凱立
## 1538   3.11              古慧雯
## 1539   2.89              黃貞穎
## 1540   3.16              蔡崇聖
## 1541   3.11              樊家忠
## 1542   2.98                狄萊
## 1543   3.20              梁明義
## 1544   3.07              毛慶生
## 1545   3.05              王泓仁
## 1546   3.25              蘇軒立
## 1547   3.38              葉淑貞
## 1548   3.40              吳中書
## 1549   3.33              葉淑貞
## 1550   3.76              吳儀玲
## 1551   3.37              張清溪
## 1552   3.39              黃金茂
## 1553   3.78              李顯峰
## 1554   3.93              宋玉生
## 1555   3.12              李怡庭
## 1556   3.25              陳南光
## 1557   4.18                    
## 1558   4.09              鄭秀玲
## 1559   3.39              崔炳和
## 1560   3.53              劉碧珍
## 1561   2.83                黃鴻
## 1562   2.77              曹添旺
## 1563   3.71              劉錦添
## 1564   3.54              黃金茂
## 1565   3.85              陳博志
## 1566   3.18              陳東升
## 1567   3.68              簡妤儒
## 1568   3.56                范雲
## 1569   3.40              林鶴玲
## 1570   2.91              郭貞蘭
## 1571   3.38              黃書緯
## 1572   3.43              賴曉黎
## 1573   3.72              黃克先
## 1574   3.44              劉華真
## 1575   2.86              林國明
## 1576   3.42              蘇國賢
## 1577   3.28              曾嬿芬
## 1578   3.00              何明修
## 1579   3.59              賴曉黎
## 1580   3.53              柯志哲
## 1581   3.68              李明璁
## 1582   3.75                范雲
## 1583   3.35              陳毓文
## 1584   3.58              傅從喜
## 1585   3.88              鄭麗珍
## 1586   3.77              楊培珊
## 1587   3.47              王雲東
## 1588   3.43              蔡貞慧
## 1589   3.84              傅從喜
## 1590   3.83              趙曉芳
## 1591   3.33              葉琇姍
## 1592   3.69              趙曉芳
## 1593   3.83                陳韺
## 1594   3.31              余漢儀
## 1595   3.50              劉瓊瑛
## 1596   3.70              沈瓊桃
## 1597   0.42                    
## 1598   3.95              林水波
## 1599   3.79              朱雲漢
## 1600   4.04              蔡政文
## 1601   4.19              趙永茂
## 1602   4.30              許介鱗
## 1603   1.37                    
## 1604   3.89              明居正
## 1605   3.64              林水波
## 1606   3.85              林子倫
## 1607   3.48              黃錦堂
## 1608   3.78              黃旻華
## 1609   3.63              張亞中
## 1610   3.59              蕭高彥
## 1611   3.95                    
## 1612   3.93              蔡季廷
## 1613   3.76              洪美仁
## 1614   3.81              蕭全政
## 1615   3.62              朱雲漢
## 1616   3.89              彭錦鵬
## 1617   3.38              徐斯勤
## 1618   4.06              林子倫
## 1619   3.92              陶儀芬
## 1620   4.04              童涵浦
## 1621   3.85              王宏文
## 1622   3.61              林萬億
## 1623   3.91              丁守中
## 1624   3.82              石之瑜
## 1625   3.99              王業立
## 1626   3.94              蘇宏達
## 1627   3.93                袁易
## 1628   3.90                袁易
## 1629   3.88              陳世民
## 1630   3.94              陳淳文
## 1631   3.54              李念祖
## 1632   3.85              陳淳文
## 1633   3.87              楊永明
## 1634   3.92              吳玉山
## 1635   2.18                    
## 1636   2.60                    
## 1637   3.71              毛慶生
## 1638   3.68              樊家忠
## 1639   3.48              陳虹如
## 1640   3.02              陳恭平
## 1641   3.28              林軒馳
## 1642   3.86              李怡庭
## 1643   4.07              陳南光
## 1644   4.08              陳虹如
## 1645   4.00              陳旭昇
## 1646   3.70              彭信坤
## 1647   3.63              林明仁
## 1648   4.00                黃鴻
## 1649   3.91              馮勃翰
## 1650   3.67              駱明慶
## 1651   3.66              蔡崇聖
## 1652   3.56              毛慶生
## 1653   3.96              宋玉生
## 1654   3.92              陳正倉
## 1655   3.78              謝德宗
## 1656   4.02              張清溪
## 1657   3.61              魏凱立
## 1658   3.70              馮勃翰
## 1659   3.72              江介維
## 1660   3.47              銀慶剛
## 1661   3.43                陳宏
## 1662   3.75              王泓仁
## 1663   3.84              李顯峰
## 1664   3.82              黃貞穎
## 1665   0.44                    
## 1666   0.99                    
## 1667   3.80              李明璁
## 1668   3.88              簡妤儒
## 1669   3.91              柯志哲
## 1670   3.80              劉華真
## 1671   3.71              吳嘉苓
## 1672   3.91              郭貞蘭
## 1673   3.92              藍佩嘉
## 1674   3.66              吳嘉苓
## 1675   3.92              陳東升
## 1676   0.35                    
## 1677   1.16                    
## 1678   4.06              沈瓊桃
## 1679   4.12              吳慧菁
## 1680   3.88              鄭麗珍
## 1681   3.89              王麗容
## 1682   4.10              楊培珊
## 1683   4.11                楊蓓
## 1684   3.55                馮燕
## 1685   3.80              熊秉荃
## 1686   3.52              劉淑瓊
## 1687   3.87              李碧涵
## 1688   3.41              邱鳳臨
## 1689   3.75              劉有恆
## 1690   3.59              劉有恆
## 1691   3.58              吳秀玲
## 1692   3.49              徐銘謙
## 1693   3.52              吳秀玲
## 1694   3.50              張國暉
## 1695   3.88              張志銘
## 1696   0.20                    
## 1697   3.83              張志銘
## 1698   3.81              辛炳隆
## 1699   3.95              黃俊傑
## 1700   3.52              邱文聰
## 1701   3.76              周嘉辰
## 1702   1.56                    
## 1703   3.86              施世駿
## 1704   4.20              周桂田
## 1705   3.83              周繼祥
## 1706   4.03              唐代彪
## 1707   3.57              張國暉
## 1708   3.76              陳明通
## 1709   4.04              張志銘
## 1710   4.09              陳顯武
## 1711   3.64              施世駿
## 1712   3.92              陳明通
## 1713   3.86              唐代彪
## 1714   3.75              陳明通
## 1715   3.71              湯德宗
## 1716   4.10              鍾國允
## 1717   3.90              邱榮舉
## 1718   3.73              徐銘謙
## 1719   3.58              鄧志松
## 1720   3.58              陳顯武
## 1721   3.68              唐代彪
## 1722   3.64              吳秀玲
## 1723   3.54              施世駿
## 1724   3.88              葛永光
## 1725   3.75              周桂田
## 1726   3.89              劉靜怡
## 1727   3.95              劉阿榮
## 1728   3.54              辛炳隆
## 1729   3.89              李碧涵
## 1730   3.72              邱鳳臨
## 1731   4.15              林月惠
## 1732   2.93              周嘉辰
## 1733   1.60                    
## 1734   3.55              王泰俐
## 1735   3.66              倪炎元
## 1736   3.99              谷玲玲
## 1737   3.85              王泰俐
## 1738   3.45              谷玲玲
## 1739   3.63              張錦華
## 1740   3.66              呂理德
## 1741   3.93              王文靜
## 1742   3.62              明居正
## 1743   4.00              林照真
## 1744   3.87              劉力仁
## 1745   3.96              江才健
## 1746   3.60              林樂群
## 1747   3.44              江才健
## 1748   3.36              洪健清
## 1749   3.76              洪健清
## 1750   3.02              胡孟君
## 1751   3.00              林琬琬
## 1752   3.46              林琬琬
## 1753   3.95              謝正宜
## 1754   3.15              張逸良
## 1755   4.05              張逸良
## 1756   4.07              吳造中
## 1757   4.17              吳造中
## 1758   2.86              李立仁
## 1759   3.68              王淑慧
## 1760   3.21              郭育良
## 1761   3.78              楊銘欽
## 1762   3.88              黃敏銓
## 1763   3.53              林敬哲
## 1764   2.86              林敬哲
## 1765   3.73              李明濱
## 1766   3.98              劉智民
## 1767   3.37              呂俊宏
## 1768   3.07              邱銘章
## 1769   3.13              鄧述諄
## 1770   3.83              鄧述諄
## 1771   3.43              鄧述諄
## 1772   3.64              鄧述諄
## 1773   3.40              鄧述諄
## 1774   3.52              洪健清
## 1775   3.49              洪健清
## 1776   4.05              陳慧玲
## 1777   3.53              張逸良
## 1778   3.06              張逸良
## 1779   3.96                許駿
## 1780   3.48              余忠仁
## 1781   3.60              黃立民
## 1782   3.44              胡務亮
## 1783   3.75              林琬琬
## 1784   3.83              林琬琬
## 1785   4.03              嚴崇仁
## 1786   3.99              王莉芳
## 1787   3.97              蔡兆勳
## 1788   3.93              余忠仁
## 1789   3.60              梁金銅
## 1790   4.03              黃瑞仁
## 1791   3.45              張逸良
## 1792   3.98              洪冠予
## 1793   3.75              方震中
## 1794   3.89              黃立民
## 1795   4.21              吳明賢
## 1796   4.04              余忠仁
## 1797   4.06              吳明賢
## 1798   3.98              吳明賢
## 1799   4.10              梁金銅
## 1800   4.05              吳明賢
## 1801   4.02              吳明賢
## 1802   4.03              鄭雅蓉
## 1803   4.06              吳明賢
## 1804   3.65              邱銘章
## 1805   4.08              蕭自佑
## 1806   4.10              吳明賢
## 1807   4.01              楊中美
## 1808   4.05              吳明賢
## 1809   4.13              王莉芳
## 1810   4.10              吳明賢
## 1811   3.85              郭育良
## 1812   4.00              郭育良
## 1813   3.97              蔡兆勳
## 1814   4.07              吳明賢
## 1815   4.00              吳建昌
## 1816   4.03              蔡甫昌
## 1817   4.30              吳明賢
## 1818   3.94              李麗娜
## 1819   4.01              楊榮森
## 1820   4.04              吳明賢
## 1821   4.03              張允中
## 1822   4.15              吳明賢
## 1823   3.73              王亭貴
## 1824   4.22              蒲永孝
## 1825   4.15              吳明賢
## 1826   3.85              方震中
## 1827   3.88              吳明賢
## 1828   4.08              陳祈安
## 1829   4.14              吳明賢
## 1830   4.15              吳明賢
## 1831   4.30              吳明賢
## 1832   3.96              余忠仁
## 1833   4.18              梁金銅
## 1834   4.04              鄭雅蓉
## 1835   4.02              吳建昌
## 1836   4.18              邱銘章
## 1837   3.98              陳祈安
## 1838   3.95              方震中
## 1839   4.10              楊志新
## 1840   4.11              王莉芳
## 1841   4.00              楊中美
## 1842   4.03              蕭自佑
## 1843   4.03              蔡兆勳
## 1844   3.99              黃立民
## 1845   4.16              蒲永孝
## 1846   3.90              張允中
## 1847   4.02              王亭貴
## 1848   3.98              楊榮森
## 1849   4.00              陳炯年
## 1850   3.81              林立德
## 1851   3.85              陳敏慧
## 1852   3.86              章浩宏
## 1853   4.02              郭生興
## 1854   3.68              陳敏慧
## 1855   3.28              鄭景暉
## 1856   3.83              陳韻之
## 1857   3.40              江俊斌
## 1858   3.48              江俊斌
## 1859   3.68              陳敏慧
## 1860   3.37              鄭景暉
## 1861   3.26              張博鈞
## 1862   3.39              陳漪紋
## 1863   3.72              鄭景暉
## 1864   3.25              陳信銘
## 1865   3.64              陳韻之
## 1866   3.19              王東美
## 1867   3.36              王東美
## 1868   3.60              郭生興
## 1869   3.67              陳羿貞
## 1870   3.92              張瑞青
## 1871   3.76              林立德
## 1872   4.05              陳敏慧
## 1873   3.87              王若松
## 1874   3.71              郭彥彬
## 1875   3.80        李正<U+5586>
## 1876   4.04              鄭景暉
## 1877   3.85              林立德
## 1878   3.98              江俊斌
## 1879   3.99              陳韻之
## 1880   4.06              陳敏慧
## 1881   3.82              鄭景暉
## 1882   3.99              陳漪紋
## 1883   3.51              陳韻之
## 1884   3.59              林立德
## 1885   3.59              王若松
## 1886   3.88        李正<U+5586>
## 1887   3.98              陳羿貞
## 1888   4.06              黃桂芬
## 1889   3.87              林立德
## 1890   2.98              楊雅雯
## 1891   3.72              楊雅雯
## 1892   3.19              許麗卿
## 1893   3.33              李水盛
## 1894   3.72              林琬琬
## 1895   3.93              林琬琬
## 1896   3.09              忻凌偉
## 1897   3.45              林文貞
## 1898   3.74        何<U+85F4>芳
## 1899   3.54              林慧玲
## 1900   3.68              林文貞
## 1901   3.72              沈麗娟
## 1902   3.69              沈麗娟
## 1903   3.70              沈麗娟
## 1904   3.71              沈麗娟
## 1905   3.75              沈麗娟
## 1906   3.71              沈麗娟
## 1907   3.75              沈麗娟
## 1908   3.69              沈麗娟
## 1909   3.70              沈麗娟
## 1910   3.71              沈麗娟
## 1911   3.74              沈麗娟
## 1912   3.95              方偉宏
## 1913   4.00              林亮音
## 1914   4.03              林亮音
## 1915   4.06              林亮音
## 1916   3.70              林亮音
## 1917   3.33              楊雅倩
## 1918   3.73              楊雅倩
## 1919   3.59              林亮音
## 1920   3.40              胡忠怡
## 1921   3.53              張逸良
## 1922   3.96              方偉宏
## 1923   3.15              鄧麗珍
## 1924   3.48              廖淑貞
## 1925   3.79              鄧麗珍
## 1926   3.12              莊雅惠
## 1927   3.38              林亮音
## 1928   2.85              張淑媛
## 1929   4.05              蔡兆勳
## 1930   3.36              吳寬墩
## 1931   3.13              江鴻生
## 1932   3.94              楊榮森
## 1933   3.93              朱宗信
## 1934   3.80              陳石池
## 1935   3.74              陳彥元
## 1936   3.28              吳佳儀
## 1937   3.64              吳佳儀
## 1938   3.00              歐展言
## 1939   3.10              于博芮
## 1940   3.80              于博芮
## 1941   3.70              張皓媛
## 1942   3.84              張皓媛
## 1943   3.65              楊曉玲
## 1944   3.86              楊曉玲
## 1945   3.89              孫秀卿
## 1946   3.58              楊雅玲
## 1947   3.85              楊雅玲
## 1948   3.84              張榮珍
## 1949   3.61              蕭淑銖
## 1950   3.95              蕭淑銖
## 1951   3.50              吳佳儀
## 1952   3.85              吳佳儀
## 1953   3.06              趙遠宏
## 1954   3.56              趙遠宏
## 1955   2.88              簡盟月
## 1956   3.55              柴惠敏
## 1957   3.71              黃正雅
## 1958   2.83              陳譽仁
## 1959   3.60              陳譽仁
## 1960   3.46              柴惠敏
## 1961   3.37              曹昭懿
## 1962   3.59              曹昭懿
## 1963   2.95              王興國
## 1964   3.72              王興國
## 1965   3.75              趙遠宏
## 1966   3.39              趙遠宏
## 1967   3.38              王亭貴
## 1968   3.69              李亞芸
## 1969   3.40              陸哲駒
## 1970   3.06              陸哲駒
## 1971   3.66              簡盟月
## 1972   3.56              陳麗秋
## 1973   3.24              陳麗秋
## 1974   3.22              徐瑋勵
## 1975   3.28              陸哲駒
## 1976   3.08              王儷穎
## 1977   3.74              林居正
## 1978   3.78              林居正
## 1979   3.63              林居正
## 1980   3.64              曹昭懿
## 1981   3.80              曹昭懿
## 1982   3.81              曹昭懿
## 1983   3.98              王興國
## 1984   3.64              林居正
## 1985   4.01              曹昭懿
## 1986   3.82              謝清麟
## 1987   3.36              曾美惠
## 1988   3.46              曾美惠
## 1989   3.86              黃小玲
## 1990   3.72              潘璦琬
## 1991   3.93              潘璦琬
## 1992   3.85              毛慧芬
## 1993   3.72                張彧
## 1994   3.74                張彧
## 1995   4.04              陳顥齡
## 1996   4.01              黃小玲
## 1997   3.56              薛漪平
## 1998   3.53              薛漪平
## 1999   3.81              黃小玲
## 2000   3.80              黃小玲
## 2001   4.12              謝清麟
## 2002   3.94              林克忠
## 2003   3.52              薛漪平
## 2004   3.83              薛漪平
## 2005   3.66              潘璦琬
## 2006   3.72              潘璦琬
## 2007   3.55              陳顥齡
## 2008   3.59              陳顥齡
## 2009   4.06              毛慧芬
## 2010   3.36              周綠蘋
## 2011   3.48              李明學
## 2012   3.94              陳炯年
## 2013   2.94              曾宇鳳
## 2014   3.69              謝松蒼
## 2015   3.87              徐志宏
## 2016   3.48              陳青周
## 2017   3.74              楊志新
## 2018   0.38              楊偉勛
## 2019   3.71              楊偉勛
## 2020   3.85              楊偉勛
## 2021   3.97              陳祈玲
## 2022   3.94              楊志新
## 2023   2.09              楊偉勛
## 2024   3.73              陳祈玲
## 2025   4.00              楊榮森
## 2026   4.30              黃立民
## 2027   4.22              陳祈安
## 2028   4.00              余忠仁
## 2029   4.08              張允中
## 2030   3.98              楊中美
## 2031   4.00              蒲永孝
## 2032   3.70              梁金銅
## 2033   4.08              方震中
## 2034   4.00              邱銘章
## 2035   3.90              蕭自佑
## 2036   4.00              王莉芳
## 2037   3.63              楊偉勛
## 2038   4.03              楊偉勛
## 2039   3.28              吳文超
## 2040   3.67              楊偉勛
## 2041   3.96              陳炯年
## 2042   3.66              楊偉勛
## 2043   0.74              陳敏慧
## 2044   4.06              陳敏慧
## 2045   4.15              陳敏慧
## 2046   4.05              陳敏慧
## 2047   4.20              江俊斌
## 2048   4.00              江俊斌
## 2049   4.30              陳敏慧
## 2050   1.68              陳敏慧
## 2051   3.93              張博鈞
## 2052   4.13              張曉華
## 2053   3.76              王若松
## 2054   3.78              王若松
## 2055   3.79              張博鈞
## 2056   3.96              陳韻之
## 2057   3.97              姚宗珍
## 2058   4.00              姚宗珍
## 2059   3.91              陳羿貞
## 2060   4.07              張曉華
## 2061   4.05              張曉華
## 2062   4.07              張曉華
## 2063   4.20              張曉華
## 2064   4.05              張曉華
## 2065   4.03              張曉華
## 2066   3.88              陳羿貞
## 2067   3.89              姚宗珍
## 2068   4.00              姚宗珍
## 2069   4.03              姚宗珍
## 2070   3.83              陳羿貞
## 2071   3.94              姚宗珍
## 2072   4.00              陳羿貞
## 2073   4.13        李正<U+5586>
## 2074   4.08        李正<U+5586>
## 2075   3.95        李正<U+5586>
## 2076   4.06        李正<U+5586>
## 2077   4.05        李正<U+5586>
## 2078   4.00        李正<U+5586>
## 2079   4.10              江俊斌
## 2080   4.06              江俊斌
## 2081   4.05        李正<U+5586>
## 2082   4.23              江俊斌
## 2083   4.24              江俊斌
## 2084   4.06              江俊斌
## 2085   4.18              江俊斌
## 2086   4.12              陳敏慧
## 2087   4.08              陳敏慧
## 2088   4.11              陳敏慧
## 2089   4.18              陳敏慧
## 2090   4.10              陳敏慧
## 2091   4.20              陳敏慧
## 2092   4.30              李伯訓
## 2093   4.06              鄭景暉
## 2094   4.11              鄭景暉
## 2095   4.11              鄭景暉
## 2096   4.08              鄭景暉
## 2097   4.09              鄭景暉
## 2098   4.02              鄭景暉
## 2099   4.06              鄭景暉
## 2100   4.06              鄭景暉
## 2101   4.09              林俊彬
## 2102   4.08              林俊彬
## 2103   4.10              郭彥彬
## 2104   4.08              郭彥彬
## 2105   4.06              郭彥彬
## 2106   4.10              郭彥彬
## 2107   4.08              張博鈞
## 2108   4.08              張博鈞
## 2109   4.04              郭彥彬
## 2110   4.14              郭彥彬
## 2111   4.01              林立德
## 2112   4.07              林立德
## 2113   4.03              王若松
## 2114   4.03              林立德
## 2115   3.94              王東美
## 2116   3.86              楊宗傑
## 2117   1.30                    
## 2118   3.89              張嘉銓
## 2119   3.96              陳基旺
## 2120   3.98              沈雅敬
## 2121   4.17              顧記華
## 2122   4.07              忻凌偉
## 2123   3.96              李水盛
## 2124   4.00              陳燕惠
## 2125   4.02              郭錦樺
## 2126   3.97              林君榮
## 2127   4.10              沈麗娟
## 2128   4.03              梁碧惠
## 2129   4.01              楊家榮
## 2130   2.46                    
## 2131   3.91              張嘉銓
## 2132   3.97              陳基旺
## 2133   4.02              沈雅敬
## 2134   4.04              顧記華
## 2135   3.97              孔繁璐
## 2136   4.03              忻凌偉
## 2137   3.99              王繼娟
## 2138   3.73              李水盛
## 2139   3.96              陳燕惠
## 2140   3.96              郭錦樺
## 2141   4.00              張嘉銓
## 2142   3.96              林文貞
## 2143   3.82              林君榮
## 2144   3.99              沈麗娟
## 2145   4.02              梁碧惠
## 2146   4.12              許麗卿
## 2147   3.92              楊家榮
## 2148   4.00              林珍芳
## 2149   3.49              林文貞
## 2150   4.00              孔繁璐
## 2151   4.15              孔繁璐
## 2152   3.98              許麗卿
## 2153   3.71              沈麗娟
## 2154   3.46        何<U+85F4>芳
## 2155   4.00              林淑文
## 2156   3.92              沈麗娟
## 2157   3.81              沈麗娟
## 2158   3.76              林淑文
## 2159   4.00              林淑文
## 2160   3.92              林慧玲
## 2161   3.00              林慧玲
## 2162   3.95        何<U+85F4>芳
## 2163   3.70              林淑文
## 2164   4.30              蕭斐元
## 2165   4.30              林珍芳
## 2166   4.30              林淑文
## 2167   4.15              蕭斐元
## 2168   4.12              蕭斐元
## 2169   4.00              郭錦樺
## 2170   0.46              林亮音
## 2171   3.81              林淑華
## 2172   2.93              林亮音
## 2173   3.48              林亮音
## 2174   4.09              林亮音
## 2175   4.03              俞松良
## 2176   3.26              林亮音
## 2177   3.09              林亮音
## 2178   3.29              吳瑞菁
## 2179   3.74              蘇剛毅
## 2180   4.03              林淑華
## 2181   0.98                    
## 2182   4.00              戴玉慈
## 2183   3.98              黃璉華
## 2184   4.17                張媚
## 2185   4.13              高碧霞
## 2186   4.10              賴裕和
## 2187   4.08              胡文郁
## 2188   4.08              蕭妃秀
## 2189   3.88              張秀如
## 2190   4.00              羅美芳
## 2191   4.11              蕭淑銖
## 2192   4.00              孫秀卿
## 2193   4.03              蕭妃秀
## 2194   3.94              羅美芳
## 2195   4.08              張秀如
## 2196   3.89                張媚
## 2197   1.65                    
## 2198   3.79              周照芳
## 2199   3.89              蔡劭瑜
## 2200   3.81              羅美芳
## 2201   3.83              陳佳慧
## 2202   3.89              陳佳慧
## 2203   3.93              陳佳慧
## 2204   3.91              黃貴薰
## 2205   3.76              黃貴薰
## 2206   3.98              胡文郁
## 2207   3.97              賴裕和
## 2208   4.00              賴裕和
## 2209   4.05              黃璉華
## 2210   4.05              黃璉華
## 2211   4.11              蕭淑銖
## 2212   4.16              蕭淑銖
## 2213   3.85              胡文郁
## 2214   1.58                    
## 2215   4.00              鄭素芳
## 2216   4.00              鄭素芳
## 2217   3.96              陳麗秋
## 2218   3.85              陳麗秋
## 2219   4.10              吳晏慈
## 2220   4.00              吳晏慈
## 2221   4.00              黃正雅
## 2222   3.83              黃正雅
## 2223   3.88              陸哲駒
## 2224   4.00              陸哲駒
## 2225   4.10              湯佩芳
## 2226   4.12              湯佩芳
## 2227   3.88              林居正
## 2228   3.93              林居正
## 2229   3.88              陳譽仁
## 2230   4.04              陳譽仁
## 2231   3.83              曹昭懿
## 2232   3.74              曹昭懿
## 2233   3.87              王儷穎
## 2234   3.30              王儷穎
## 2235   1.85              王儷穎
## 2236   3.90              湯佩芳
## 2237   4.30              曹昭懿
## 2238   4.30              曹昭懿
## 2239   2.05                    
## 2240   4.05              陳譽仁
## 2241   4.00              黃正雅
## 2242   3.93              陳麗秋
## 2243   3.68              王儷穎
## 2244   4.13              陳譽仁
## 2245   4.00              黃正雅
## 2246   4.00              陳麗秋
## 2247   3.79              林居正
## 2248   3.78              鄭素芳
## 2249   3.70              曹昭懿
## 2250   3.78              鄭素芳
## 2251   3.75              簡盟月
## 2252   3.65              陳麗秋
## 2253   3.75              陳麗秋
## 2254   3.93              吳晏慈
## 2255   3.78              王儷穎
## 2256   3.15              簡盟月
## 2257   4.00              黃正雅
## 2258   3.81              黃正雅
## 2259   3.96              陳譽仁
## 2260   3.90              陳譽仁
## 2261   3.89              鄭素芳
## 2262   3.85              王儷穎
## 2263   3.74              陸哲駒
## 2264   3.81              趙遠宏
## 2265   3.82              陳麗秋
## 2266   3.79              湯佩芳
## 2267   3.90              徐瑋勵
## 2268   3.96              陳譽仁
## 2269   0.79              曾美惠
## 2270   4.08              林克忠
## 2271   3.95              謝清麟
## 2272   3.93              曾美惠
## 2273   4.00              薛漪平
## 2274   4.00              林克忠
## 2275   3.85              謝清麟
## 2276   4.00              曾美惠
## 2277   4.30              薛漪平
## 2278   4.15              林克忠
## 2279   4.00              謝清麟
## 2280   3.90              曾美惠
## 2281   4.00              潘璦琬
## 2282   3.90              薛漪平
## 2283   3.70              陳顥齡
## 2284   4.10              林克忠
## 2285   3.90              謝清麟
## 2286   4.00              曾美惠
## 2287   3.90              潘璦琬
## 2288   4.00              薛漪平
## 2289   4.00              毛慧芬
## 2290   4.00              林克忠
## 2291   3.95              謝清麟
## 2292   4.00              曾美惠
## 2293   3.62              潘璦琬
## 2294   3.85              薛漪平
## 2295   4.00              毛慧芬
## 2296   3.80              謝清麟
## 2297   3.85              曾美惠
## 2298   3.94              潘璦琬
## 2299   3.85              薛漪平
## 2300   4.00              毛慧芬
## 2301   3.95              謝清麟
## 2302   2.43              曾美惠
## 2303   4.01              林克忠
## 2304   3.88              潘璦琬
## 2305   4.18              林克忠
## 2306   4.00              謝清麟
## 2307   3.93              曾美惠
## 2308   4.00              潘璦琬
## 2309   4.00              薛漪平
## 2310   4.00              毛慧芬
## 2311   3.85                張彧
## 2312   4.30              陳顥齡
## 2313   4.00              黃小玲
## 2314   4.30              吳建德
## 2315   4.30              王湉妮
## 2316   4.12              林克忠
## 2317   4.00              曾美惠
## 2318   4.08              毛慧芬
## 2319   4.00                張彧
## 2320   4.30              陳顥齡
## 2321   4.30              吳建德
## 2322   4.30              王湉妮
## 2323   4.00              謝清麟
## 2324   3.85              曾美惠
## 2325   3.70              潘璦琬
## 2326   3.70              毛慧芬
## 2327   4.30              陳顥齡
## 2328   4.00              毛慧芬
## 2329   4.02                張彧
## 2330   0.66                    
## 2331   3.86              賴亮全
## 2332   2.13                    
## 2333   3.85              賴亮全
## 2334   3.50              湯志永
## 2335   3.72              胡孟君
## 2336   3.68              余佳慧
## 2337   3.83              賴亮全
## 2338   4.01              詹智強
## 2339   0.52              林敬哲
## 2340   3.91              林敬哲
## 2341   3.38              林敬哲
## 2342   2.33              林敬哲
## 2343   3.87              林敬哲
## 2344   3.51              張富雄
## 2345   4.24              詹迺立
## 2346   4.17              李明學
## 2347   4.08              呂紹俊
## 2348   4.13              張明富
## 2349   3.87              周綠蘋
## 2350   4.30              顏伯勳
## 2351   3.88              游偉絢
## 2352   4.04              余明俊
## 2353   3.94              林敬哲
## 2354   4.00              曾秀如
## 2355   4.00              歐展言
## 2356   0.53              林琬琬
## 2357   3.88              林琬琬
## 2358   4.07              林琬琬
## 2359   2.27              林琬琬
## 2360   3.92              林琬琬
## 2361   3.77              黃德富
## 2362   4.00              邱麗珠
## 2363   4.05              符文美
## 2364   3.99              陳青周
## 2365   0.50              張逸良
## 2366   4.14              張逸良
## 2367   2.85              張逸良
## 2368   1.16              張逸良
## 2369   3.96              張逸良
## 2370   4.02              張逸良
## 2371   3.56              張逸良
## 2372   4.12              張逸良
## 2373   0.60              鄧述諄
## 2374   3.85              鄧述諄
## 2375   3.91              蔡錦華
## 2376   3.51              鄧述諄
## 2377   4.04              鄧述諄
## 2378   3.63              鄧述諄
## 2379   4.00              洪健清
## 2380   4.12              楊宏志
## 2381   4.12              詹世鵬
## 2382   3.94                張鑫
## 2383   3.42              洪健清
## 2384   4.30              蕭信宏
## 2385   4.30              蕭信宏
## 2386   3.99              蔡錦華
## 2387   4.00              董馨蓮
## 2388   4.01              王錦堂
## 2389   3.76              鄧述諄
## 2390   0.70              謝松蒼
## 2391   4.00              謝松蒼
## 2392   1.95              謝松蒼
## 2393   3.97              謝松蒼
## 2394   4.01              呂俊宏
## 2395   4.00              陳玉怜
## 2396   3.50              王淑慧
## 2397   3.20              呂俊宏
## 2398   3.37              黃敏銓
## 2399   3.08              龔秀妮
## 2400   3.40              陳玉怜
## 2401   2.77              李立仁
## 2402   1.85                    
## 2403   3.78              陳惠文
## 2404   3.93              陳惠文
## 2405   3.91              陳惠文
## 2406   4.10              陳惠文
## 2407   4.12              陳惠文
## 2408   2.17                    
## 2409   3.80              陳惠文
## 2410   4.05              陳惠文
## 2411   4.09              陳惠文
## 2412   3.26              陳惠文
## 2413   3.87              陳惠文
## 2414   0.48                    
## 2415   3.60              潘俊良
## 2416   3.45              李秀香
## 2417   3.02              張智芬
## 2418   1.86                    
## 2419   3.51              潘俊良
## 2420   3.42              蔡欣祐
## 2421   4.05              胡務亮
## 2422   3.93              黃璉華
## 2423   3.60              吳英璋
## 2424   3.96                戴政
## 2425   3.96              胡務亮
## 2426   4.07              胡務亮
## 2427   0.57              李建國
## 2428   3.87              顧家綺
## 2429   3.14              李建國
## 2430   3.97              繆希椿
## 2431   4.07              顧家綺
## 2432   4.09              顧家綺
## 2433   3.97              李建國
## 2434   4.06              許秉寧
## 2435   4.30              繆希椿
## 2436   3.96              賈景山
## 2437   4.10              伍安怡
## 2438   3.64              許秉寧
## 2439   4.00              許秉寧
## 2440   4.03              朱清良
## 2441   4.30              顧家綺
## 2442   4.15              李伯訓
## 2443   4.15              張百恩
## 2444   4.21              張正琪
## 2445   4.00              周涵怡
## 2446   3.26                    
## 2447   4.04              李伯訓
## 2448   3.99              李伯訓
## 2449   4.04              周涵怡
## 2450   3.89              張百恩
## 2451   4.19              張正琪
## 2452   4.04              張百恩
## 2453   4.06              周涵怡
## 2454   4.10              吳漢忠
## 2455   4.30              樓國隆
## 2456   4.30              樓國隆
## 2457   4.07              張百恩
## 2458   4.13              周涵怡
## 2459   4.30              樓國隆
## 2460   2.85        何<U+85F4>芳
## 2461   3.98              林慧玲
## 2462   3.98              蕭斐元
## 2463   3.92              蕭斐元
## 2464   3.31              林慧玲
## 2465   2.20              華筱玲
## 2466   3.33              孫家棟
## 2467   3.37              李俊億
## 2468   3.61              陳珮珊
## 2469   3.53              孫家棟
## 2470   3.80              華筱玲
## 2471   3.72              華筱玲
## 2472   3.66              李俊億
## 2473   3.96              華筱玲
## 2474   3.48              李俊億
## 2475   0.09              楊志新
## 2476   3.86              楊志新
## 2477   3.87              楊志新
## 2478   3.95              葉坤輝
## 2479   3.57                許駿
## 2480   3.50              歐大諒
## 2481   3.97              吳文超
## 2482   2.09                    
## 2483   4.06              吳恩賜
## 2484   4.27              王培育
## 2485   4.30              黃憲松
## 2486   0.00              陳信孚
## 2487   3.94              陳沛隆
## 2488   4.24              陳信孚
## 2489   4.15              陳沛隆
## 2490   4.30              陳佑宗
## 2491   4.21              陳佑宗
## 2492   0.40                    
## 2493   4.17              吳明賢
## 2494   4.30              吳明賢
## 2495   3.89              吳明賢
## 2496   4.06              吳明賢
## 2497   3.85              陳瑞華
## 2498   3.92              黃尹男
## 2499   4.02              陳柏華
## 2500   3.95              施上粟
## 2501   3.86              許聿廷
## 2502   3.96              張書瑋
## 2503   3.88              朱致遠
## 2504   3.34              陳柏華
## 2505   3.15              謝尚賢
## 2506   2.55              陳俊杉
## 2507   2.36              張書瑋
## 2508   2.63              詹益齊
## 2509   2.35              劉格非
## 2510   2.80        葛宇<U+5BD7>
## 2511   2.79              黃尹男
## 2512   2.41              張家銘
## 2513   2.79              蔡宛珊
## 2514   2.65              卡艾瑋
## 2515   2.88              黃良雄
## 2516   3.15              陳振川
## 2517   3.21              郭安妮
## 2518   3.34              張家銘
## 2519   3.04              邱俊翔
## 2520   3.02              詹穎雯
## 2521   3.38              楊國鑫
## 2522   3.65              賴勇成
## 2523   3.17              詹穎雯
## 2524   3.41              廖文正
## 2525   3.78              田堯彰
## 2526   4.08              卡艾瑋
## 2527   3.17              黃世建
## 2528   3.73              陳清泉
## 2529   2.28              呂良正
## 2530   2.47              周中哲
## 2531   2.58              歐昱辰
## 2532   3.12              施上粟
## 2533   3.24              李天浩
## 2534   3.45              游景雲
## 2535   3.59              賴仕堯
## 2536   3.52              許添本
## 2537   3.23              荷世平
## 2538   2.30              邱俊翔
## 2539   2.32              卿建業
## 2540   2.85              楊國鑫
## 2541   3.49              郭斯傑
## 2542   3.23              曾惠斌
## 2543   3.21              李公哲
## 2544   3.50              歐昱辰
## 2545   4.12              於幼華
## 2546   4.00              郭安妮
## 2547   3.85        葛宇<U+5BD7>
## 2548   3.85              邱俊翔
## 2549   4.30              黃尹男
## 2550   4.00              張家銘
## 2551   4.30              林銘郎
## 2552   4.00              詹穎雯
## 2553   4.30              黃世建
## 2554   4.00              廖文正
## 2555   4.00              蔡克銓
## 2556   4.30              呂良正
## 2557   3.93              張國鎮
## 2558   4.30              李鴻源
## 2559   4.30              劉格非
## 2560   4.15              李天浩
## 2561   4.10              游景雲
## 2562   4.00              蔡宛珊
## 2563   4.12              張學孔
## 2564   4.00              韓仁毓
## 2565   4.12              許添本
## 2566   3.79              賴勇成
## 2567   4.00              陳柏華
## 2568   4.30              郭斯傑
## 2569   4.00              曾惠斌
## 2570   3.70              荷世平
## 2571   4.15              詹瀅潔
## 2572   4.04              陳柏翰
## 2573   3.70              徐百輝
## 2574   4.15              陳俊杉
## 2575   3.33              康仕仲
## 2576   3.59              洪如江
## 2577   2.50              楊烽正
## 2578   3.74              廖洺漢
## 2579   3.60              詹魁元
## 2580   3.52        蘇偉<U+5101>
## 2581   2.68              蕭浩明
## 2582   2.49              楊馥菱
## 2583   2.81              施文彬
## 2584   2.73                李綱
## 2585   2.78              楊士進
## 2586   2.66              陽毅平
## 2587   2.45              施文彬
## 2588   3.07              莊嘉揚
## 2589   2.99              劉建豪
## 2590   2.93              蔡協澄
## 2591   2.72              馬小康
## 2592   2.97              范士岡
## 2593   2.74              廖運炫
## 2594   2.81              潘永寧
## 2595   3.04              楊宏智
## 2596   2.64              劉建豪
## 2597   2.75              單秋成
## 2598   2.72              顏家鈺
## 2599   3.21              陳希立
## 2600   3.49              蔡曜陽
## 2601   3.70              楊申語
## 2602   2.97              陳志軒
## 2603   3.64              楊申語
## 2604   3.21              林祥泰
## 2605   3.10        游琇<U+4F03>
## 2606   3.43              徐振哲
## 2607   2.90              童國倫
## 2608   3.28              游佳欣
## 2609   3.12              戴子安
## 2610   2.99        游琇<U+4F03>
## 2611   3.39              邱文英
## 2612   3.47              徐治平
## 2613   3.46              蔡偉博
## 2614   2.63              李篤中
## 2615   3.10              劉懷勝
## 2616   3.29              謝之真
## 2617   3.30              吳紀聖
## 2618   3.23              謝學真
## 2619   3.16              諶玉真
## 2620   3.31              康敦彥
## 2621   4.25              徐治平
## 2622   4.30              葛煥彰
## 2623   3.58              顏溪成
## 2624   4.27              吳乃立
## 2625   4.00              萬本儒
## 2626   3.80              陳立仁
## 2627   3.30              劉懷勝
## 2628   4.22              李篤中
## 2629   4.30              呂宗昕
## 2630   4.03              何國川
## 2631   4.30              李克強
## 2632   4.00              陳文章
## 2633   3.88              吳紀聖
## 2634   3.81              王大銘
## 2635   4.00              謝學真
## 2636   4.15              諶玉真
## 2637   3.97              蔡偉博
## 2638   4.04              戴子安
## 2639   3.95              錢義隆
## 2640   4.03              王勝仕
## 2641   4.05              林祥泰
## 2642   4.18              童國倫
## 2643   4.18              徐振哲
## 2644   4.05              吳嘉文
## 2645   0.00              吳哲夫
## 2646   3.00              謝之真
## 2647   4.22              廖英志
## 2648   4.15              陳賢燁
## 2649   3.96              游佳欣
## 2650   4.19                趙玲
## 2651   4.18              康敦彥
## 2652   3.53              顏溪成
## 2653   4.20              吳乃立
## 2654   4.04              陳立仁
## 2655   4.20              李篤中
## 2656   4.21              何國川
## 2657   4.30              李克強
## 2658   4.12              吳紀聖
## 2659   4.00              王大銘
## 2660   4.00              謝學真
## 2661   4.30              諶玉真
## 2662   3.93              蔡偉博
## 2663   4.24              戴子安
## 2664   4.13              錢義隆
## 2665   3.94              王勝仕
## 2666   4.12              林祥泰
## 2667   4.15              徐振哲
## 2668   4.30              吳嘉文
## 2669   4.00              吳哲夫
## 2670   4.00              謝之真
## 2671   4.17              廖英志
## 2672   4.25              陳賢燁
## 2673   4.21              游佳欣
## 2674   4.25                趙玲
## 2675   2.97              萬本儒
## 2676   2.97              游佳欣
## 2677   2.68              黃孝平
## 2678   3.35              陳延平
## 2679   3.23              徐振哲
## 2680   3.35              江茂雄
## 2681   2.40              黃維信
## 2682   3.12              陳昭宏
## 2683   3.55              蔡武廷
## 2684   2.97              黃乾綱
## 2685   2.88              黃維信
## 2686   2.38              戴璽恆
## 2687   2.76              趙修武
## 2688   2.96              戴璽恆
## 2689   2.86              張恆華
## 2690   3.72              陳琪芳
## 2691   2.90              李佳翰
## 2692   4.04              陳昭宏
## 2693   3.95              江茂雄
## 2694   3.93              陳琪芳
## 2695   3.41              張瑞益
## 2696   3.16              黃心豪
## 2697   2.60              郭振華
## 2698   3.43              廖文彬
## 2699   3.07              曾建祥
## 2700   3.21              郭錦龍
## 2701   3.21              溫政彥
## 2702   3.14              蔡豐羽
## 2703   3.86              廖文彬
## 2704   3.32              謝宗霖
## 2705   2.73              高振宏
## 2706   0.60                    
## 2707   3.28              李鴻源
## 2708   2.63                    
## 2709   3.83              黃良雄
## 2710   3.87              郭安妮
## 2711   3.64              朱致遠
## 2712   3.90              許添本
## 2713   3.27              洪宏基
## 2714   3.18              陳俊杉
## 2715   3.63              黃燦輝
## 2716   3.07              鄭富書
## 2717   3.58              郭安妮
## 2718   3.42              黃良雄
## 2719   4.00              謝尚賢
## 2720   3.99              荷世平
## 2721   3.81              周家蓓
## 2722   3.54              羅俊雄
## 2723   3.79              康仕仲
## 2724   4.00              康仕仲
## 2725   3.89              荷世平
## 2726   3.33              趙鍵哲
## 2727   3.35              韓仁毓
## 2728   3.83              郭斯傑
## 2729   3.80              黃翊之
## 2730   3.71              曾大仁
## 2731   3.98              荷世平
## 2732   3.83              郭斯傑
## 2733   3.87              徐百輝
## 2734   4.08              曾惠斌
## 2735   3.99              荷世平
## 2736   3.46              蔡克銓
## 2737   3.92              張陸滿
## 2738   3.77              韓仁毓
## 2739   3.64              羅俊雄
## 2740   4.02              韓仁毓
## 2741   3.81                王弓
## 2742   4.18              蔡宛珊
## 2743   3.95              卡艾瑋
## 2744   3.96              吳賴雲
## 2745   3.95              何昊哲
## 2746   3.93              邱俊翔
## 2747   3.16              王劍能
## 2748   3.50              謝尚賢
## 2749   3.59              徐百輝
## 2750   3.72              賴勇成
## 2751   3.63              李鴻源
## 2752   3.11              卿建業
## 2753   3.74              康仕仲
## 2754   3.89              謝尚賢
## 2755   3.83              許聿廷
## 2756   3.92              陳椿亮
## 2757   1.00                    
## 2758   4.07              陳漢明
## 2759   4.06              楊鏡堂
## 2760   4.04              黃秉鈞
## 2761   4.02              楊宏智
## 2762   4.00              伍次寅
## 2763   3.93              廖運炫
## 2764   3.94              李志中
## 2765   4.07              陽毅平
## 2766   4.00                李綱
## 2767   4.16              潘永寧
## 2768   4.00              廖洺漢
## 2769   4.15              馬劍清
## 2770   3.85              黃漢邦
## 2771   4.01              陳達仁
## 2772   4.17              陳希立
## 2773   3.92              馬小康
## 2774   4.08              吳文方
## 2775   4.03              陳炳煇
## 2776   4.12              單秋成
## 2777   4.10                劉霆
## 2778   4.06              陳亮嘉
## 2779   3.99              顏家鈺
## 2780   4.04              蕭浩明
## 2781   4.16              楊申語
## 2782   3.78              林沛群
## 2783   4.26              楊燿州
## 2784   4.24              陳復國
## 2785   3.87              陳湘鳳
## 2786   4.21              黃光裕
## 2787   4.07              黃美嬌
## 2788   4.24              詹魁元
## 2789   4.17        蘇偉<U+5101>
## 2790   4.18              楊馥菱
## 2791   4.27              施文彬
## 2792   4.08              潘國隆
## 2793   4.19              孫珍理
## 2794   4.27              張所鋐
## 2795   4.08              鄭榮和
## 2796   4.09              蔡曜陽
## 2797   4.07              蔡協澄
## 2798   3.23                    
## 2799   3.75              黃信富
## 2800   3.78              楊鏡堂
## 2801   3.55              孫珍理
## 2802   3.78              吳文方
## 2803   3.68                劉霆
## 2804   3.77              李貫銘
## 2805   3.68              蕭浩明
## 2806   4.04              陳漢明
## 2807   4.08              陳永傳
## 2808   4.16              吳錫侃
## 2809   4.11              黃秉鈞
## 2810   3.95              楊宏智
## 2811   4.05              陳瑤明
## 2812   3.97              廖運炫
## 2813   4.00              鍾添東
## 2814   4.05              伍次寅
## 2815   4.01              廖洺漢
## 2816   4.11              潘永寧
## 2817   4.22              張鈞棣
## 2818   4.16        蘇偉<U+5101>
## 2819   4.19              馬劍清
## 2820   4.06              黃漢邦
## 2821   3.92              詹魁元
## 2822   4.18              陳希立
## 2823   3.97              馬小康
## 2824   4.02              吳文方
## 2825   3.96              陳炳煇
## 2826   4.03              陳志軒
## 2827   4.05              單秋成
## 2828   4.10                劉霆
## 2829   3.99              陽毅平
## 2830   3.90              陳亮嘉
## 2831   3.96              顏家鈺
## 2832   4.23              楊士進
## 2833   4.16              楊申語
## 2834   4.04              張所鋐
## 2835   4.23              鄭榮和
## 2836   4.19              陳復國
## 2837   4.06              陳達仁
## 2838   4.04              劉建豪
## 2839   4.09              陳振山
## 2840   4.01              黃光裕
## 2841   4.16              盧中仁
## 2842   3.99              黃美嬌
## 2843   3.97              李志中
## 2844   4.21              楊燿州
## 2845   3.84              蔡曜陽
## 2846   4.13              王富正
## 2847   4.12              施文彬
## 2848   3.91              潘國隆
## 2849   4.08              楊馥菱
## 2850   4.06              陳湘鳳
## 2851   4.22              林沛群
## 2852   4.15              楊鏡堂
## 2853   4.14              蕭浩明
## 2854   3.98              李貫銘
## 2855   3.91              黃信富
## 2856   3.82                李綱
## 2857   4.18              莊嘉揚
## 2858   4.08              孫珍理
## 2859   4.14              范士岡
## 2860   4.09              蔡協澄
## 2861   3.85              廖先順
## 2862   3.34              伍次寅
## 2863   4.02              陳復國
## 2864   3.69              王富正
## 2865   3.50                劉霆
## 2866   3.71              黃漢邦
## 2867   3.72              陳振山
## 2868   4.03              張所鋐
## 2869   4.05              顏家鈺
## 2870   4.10              陳漢明
## 2871   3.99              陳湘鳳
## 2872   4.16              楊鏡堂
## 2873   4.18              陳亮嘉
## 2874   4.06              范士岡
## 2875   4.21        蘇偉<U+5101>
## 2876   4.17              馬劍清
## 2877   3.97              黃漢邦
## 2878   4.13              蔡曜陽
## 2879   4.07              陳希立
## 2880   4.00              馬小康
## 2881   3.85              楊宏智
## 2882   4.25              廖先順
## 2883   4.15              陳炳煇
## 2884   4.30              黃美嬌
## 2885   4.08                劉霆
## 2886   4.04              邱文祥
## 2887   4.00              劉建豪
## 2888   4.08              鄭榮和
## 2889   3.70              張鈞棣
## 2890   4.08              蔡協澄
## 2891   3.91              陳志軒
## 2892   4.12              黃光裕
## 2893   3.98              楊申語
## 2894   4.01              吳錫侃
## 2895   4.17              李貫銘
## 2896   4.12              陳永傳
## 2897   3.95              楊燿州
## 2898   4.07              王富正
## 2899   4.14              施文彬
## 2900   4.20              楊士進
## 2901   3.97              楊馥菱
## 2902   4.18              廖運炫
## 2903   4.09              林沛群
## 2904   3.97              潘永寧
## 2905   4.04              蕭浩明
## 2906   3.74              黃信富
## 2907   4.10                李綱
## 2908   4.23              莊嘉揚
## 2909   4.11              孫珍理
## 2910   4.20              廖洺漢
## 2911   4.09              詹魁元
## 2912   4.15              潘國隆
## 2913   3.52              李志中
## 2914   3.42              盧中仁
## 2915   4.02              黃秉鈞
## 2916   3.47              廖先順
## 2917   3.23              張所鋐
## 2918   3.86              顏家鈺
## 2919   3.63              林沛群
## 2920   3.85                劉霆
## 2921   3.53              陳達仁
## 2922   3.33              楊鏡堂
## 2923   3.33              廖先順
## 2924   4.00              陳亮嘉
## 2925   3.80              陳漢明
## 2926   3.97              楊馥菱
## 2927   3.72              陳漢明
## 2928   3.80              陳湘鳳
## 2929   3.68              蕭浩明
## 2930   3.90              黃信富
## 2931   3.94              楊申語
## 2932   3.66              范士岡
## 2933   4.13                劉霆
## 2934   3.83              陽毅平
## 2935   2.01                    
## 2936   4.27              陳延平
## 2937   3.98              徐治平
## 2938   4.14              葛煥彰
## 2939   4.06              顏溪成
## 2940   4.28              吳乃立
## 2941   4.16              陳誠亮
## 2942   4.07              萬本儒
## 2943   3.94              陳立仁
## 2944   4.22              劉懷勝
## 2945   4.30              李篤中
## 2946   4.30              呂宗昕
## 2947   3.71              藍崇文
## 2948   4.15              何國川
## 2949   4.30              李克強
## 2950   4.18              陳文章
## 2951   4.12              吳紀聖
## 2952   4.09              王大銘
## 2953   4.22              謝學真
## 2954   4.28              諶玉真
## 2955   4.30              蔡偉博
## 2956   4.28              戴子安
## 2957   4.30              錢義隆
## 2958   4.18              王勝仕
## 2959   4.20              林祥泰
## 2960   4.16              童國倫
## 2961   3.98              徐振哲
## 2962   4.14              吳嘉文
## 2963   4.06              吳哲夫
## 2964   4.08              謝之真
## 2965   4.00              廖英志
## 2966   4.30              陳賢燁
## 2967   4.24                趙玲
## 2968   3.68                    
## 2969   4.00              李篤中
## 2970   3.54              林啟萬
## 2971   3.58              諶玉真
## 2972   3.52              闕居振
## 2973   3.36              藍崇文
## 2974   3.42              王大銘
## 2975   3.66              吳哲夫
## 2976   3.78              錢義隆
## 2977   4.25              陳延平
## 2978   4.22              徐治平
## 2979   4.00              葛煥彰
## 2980   4.13              顏溪成
## 2981   4.27              吳乃立
## 2982   3.95              陳誠亮
## 2983   3.80              萬本儒
## 2984   4.11              陳立仁
## 2985   4.30              劉懷勝
## 2986   4.17              李篤中
## 2987   4.27              呂宗昕
## 2988   3.37              藍崇文
## 2989   4.12              何國川
## 2990   4.22              李克強
## 2991   4.05              陳文章
## 2992   3.84              吳紀聖
## 2993   4.04              王大銘
## 2994   4.00              謝學真
## 2995   4.27              諶玉真
## 2996   4.02              蔡偉博
## 2997   4.28              戴子安
## 2998   4.06              錢義隆
## 2999   4.19              王勝仕
## 3000   4.21              林祥泰
## 3001   4.14              童國倫
## 3002   4.24              徐振哲
## 3003   4.30              吳嘉文
## 3004   3.97              吳哲夫
## 3005   4.00              謝之真
## 3006   4.21              廖英志
## 3007   4.27              陳賢燁
## 3008   4.25              游佳欣
## 3009   4.00                趙玲
## 3010   4.30              康敦彥
## 3011   4.26              邱文英
## 3012   4.25              陳延平
## 3013   4.25              徐治平
## 3014   4.23              葛煥彰
## 3015   4.27              謝國煌
## 3016   4.20              顏溪成
## 3017   4.09              吳乃立
## 3018   4.00              陳誠亮
## 3019   4.06              萬本儒
## 3020   3.90              陳立仁
## 3021   4.30              劉懷勝
## 3022   4.25              李篤中
## 3023   4.27              呂宗昕
## 3024   3.34              藍崇文
## 3025   4.24              何國川
## 3026   4.30              李克強
## 3027   4.27              陳文章
## 3028   4.14              吳紀聖
## 3029   4.04              王大銘
## 3030   4.03              謝學真
## 3031   4.25              諶玉真
## 3032   4.11              蔡偉博
## 3033   4.27              戴子安
## 3034   4.27              錢義隆
## 3035   4.25              王勝仕
## 3036   4.24              林祥泰
## 3037   4.17              童國倫
## 3038   4.28              徐振哲
## 3039   4.07              吳嘉文
## 3040   4.00              吳哲夫
## 3041   4.15              謝之真
## 3042   4.20              廖英志
## 3043   4.30              陳賢燁
## 3044   4.22              游佳欣
## 3045   4.30                趙玲
## 3046   3.55              吳紀聖
## 3047   3.24              呂宗昕
## 3048   3.66              吳紀聖
## 3049   3.97              李克強
## 3050   3.65              谷家嵩
## 3051   3.50              謝國煌
## 3052   3.78              王勝仕
## 3053   0.41                    
## 3054   3.86              趙修武
## 3055   4.10              洪振發
## 3056   4.25              許文翰
## 3057   4.08              李世光
## 3058   3.89              黃維信
## 3059   3.75              宋家驥
## 3060   4.17              薛文証
## 3061   4.14              郭振華
## 3062   4.15              丁肇隆
## 3063   4.15              張瑞益
## 3064   4.08              吳文中
## 3065   4.10              黃乾綱
## 3066   4.04              李佳翰
## 3067   4.30              江茂雄
## 3068   4.00              張恆華
## 3069   4.30              蔡武廷
## 3070   3.90              黃心豪
## 3071   2.40                    
## 3072   3.74              李岳聯
## 3073   3.79              戴璽恆
## 3074   4.02              邱逢琛
## 3075   4.17              許文翰
## 3076   4.05              李世光
## 3077   4.04              蔡進發
## 3078   3.64              黃維信
## 3079   4.06              宋家驥
## 3080   4.19              薛文証
## 3081   3.98              王昭男
## 3082   4.06              陳琪芳
## 3083   4.05              郭振華
## 3084   3.86              丁肇隆
## 3085   4.11              張瑞益
## 3086   4.02              吳文中
## 3087   3.98              黃乾綱
## 3088   4.03              李佳翰
## 3089   4.28              江茂雄
## 3090   4.13              陳昭宏
## 3091   4.29              李坤彥
## 3092   3.98              張恆華
## 3093   4.30              蔡武廷
## 3094   3.98              黃心豪
## 3095   4.30              戴璽恆
## 3096   3.27              丁肇隆
## 3097   3.77              蔡武廷
## 3098   3.57              黃乾綱
## 3099   4.19              薛文証
## 3100   4.00              許文翰
## 3101   4.17              李世光
## 3102   4.23              蔡進發
## 3103   4.30              宋家驥
## 3104   3.83              薛文証
## 3105   3.90              陳琪芳
## 3106   4.10              丁肇隆
## 3107   3.42              張瑞益
## 3108   3.94              吳文中
## 3109   3.92              黃乾綱
## 3110   4.03              江茂雄
## 3111   4.16              陳昭宏
## 3112   4.27              李坤彥
## 3113   3.95              張恆華
## 3114   4.30              蔡武廷
## 3115   3.66              黃心豪
## 3116   4.10              李岳聯
## 3117   3.80              蔡進發
## 3118   3.59              柯文俊
## 3119   3.56              陳重盛
## 3120   3.70              黃乾綱
## 3121   3.81              陳琪芳
## 3122   3.57              黃正利
## 3123   3.74              吳文中
## 3124   3.97              李坤彥
## 3125   1.47                    
## 3126   4.20              吳錫侃
## 3127   4.22              莊東漢
## 3128   4.19              楊哲人
## 3129   3.67              邱文英
## 3130   4.11              林金福
## 3131   4.26              段維新
## 3132   3.53              林唯芳
## 3133   4.12              薛景中
## 3134   4.17              林新智
## 3135   4.17              高振宏
## 3136   4.08              林招松
## 3137   4.27              薛人愷
## 3138   3.99              陳學禮
## 3139   4.14              溫政彥
## 3140   4.00              謝宗霖
## 3141   4.18              陳敏璋
## 3142   4.03              蔡豐羽
## 3143   4.11              趙基揚
## 3144   4.26              郭錦龍
## 3145   4.27              薛承輝
## 3146   4.14              顏鴻威
## 3147   3.11                    
## 3148   4.08              羅世強
## 3149   4.20              吳錫侃
## 3150   4.12              白奇峰
## 3151   4.21              莊東漢
## 3152   4.15              薛承輝
## 3153   4.25              溫政彥
## 3154   3.86              郭錦龍
## 3155   4.26              趙基揚
## 3156   3.92              楊哲人
## 3157   3.95              林金福
## 3158   3.91              韋文誠
## 3159   4.20              段維新
## 3160   3.83              林唯芳
## 3161   3.79              廖文彬
## 3162   4.19              林新智
## 3163   4.10              高振宏
## 3164   4.17              林招松
## 3165   4.13              薛人愷
## 3166   4.29              陳俊維
## 3167   4.03              陳學禮
## 3168   4.14              薛景中
## 3169   4.19              謝宗霖
## 3170   4.07              陳敏璋
## 3171   4.30              蔡豐羽
## 3172   4.18              顏鴻威
## 3173   3.67              蔡豐羽
## 3174   3.58              林峰輝
## 3175   3.51              楊哲人
## 3176   3.25              溫政彥
## 3177   3.53              薛人愷
## 3178   3.49              楊哲人
## 3179   3.78              白奇峰
## 3180   3.56              林招松
## 3181   3.81              段維新
## 3182   3.30              林金福
## 3183   3.15              吳錫侃
## 3184   4.10              吳錫侃
## 3185   3.65              韋文誠
## 3186   3.43              廖文彬
## 3187   4.22              楊哲人
## 3188   3.65              顏鴻威
## 3189   3.43              羅世強
## 3190   4.25              段維新
## 3191   4.00              林新智
## 3192   4.30              高振宏
## 3193   3.98              林招松
## 3194   3.95              白奇峰
## 3195   4.18              陳俊維
## 3196   3.84              陳學禮
## 3197   3.95              薛承輝
## 3198   4.18              蔡豐羽
## 3199   3.96              陳敏璋
## 3200   3.77              林唯芳
## 3201   4.06              郭錦龍
## 3202   4.08              溫政彥
## 3203   4.20              楊哲人
## 3204   4.10              高振宏
## 3205   3.72              羅世強
## 3206   4.00              陳學禮
## 3207   4.04              林新智
## 3208   4.27              林唯芳
## 3209   3.94              薛承輝
## 3210   3.93              陳敏璋
## 3211   4.22              郭錦龍
## 3212   4.30              薛景中
## 3213   3.60              陳敏璋
## 3214   4.04              薛承輝
## 3215   3.69              韋文誠
## 3216   2.71              趙基揚
## 3217   0.86                    
## 3218   3.98              吳先琪
## 3219   3.96              林郁真
## 3220   4.05              吳先琪
## 3221   1.94                    
## 3222   4.28              林正芳
## 3223   4.11              林正芳
## 3224   3.98              馬鴻文
## 3225   4.07              童心欣
## 3226   3.91              馬鴻文
## 3227   3.62              席行正
## 3228   3.88              闕蓓德
## 3229   3.45              鄭福田
## 3230   3.94                鄒倫
## 3231   3.51              林逸彬
## 3232   3.83              于昌平
## 3233   3.84              李公哲
## 3234   3.44              蔣本基
## 3235   3.81              林鎮洋
## 3236   1.00                    
## 3237   3.71              王立昇
## 3238   3.02                    
## 3239   3.74              陳建甫
## 3240   3.71              李尉彰
## 3241   4.04              王立昇
## 3242   3.94              郭茂坤
## 3243   3.94              張建成
## 3244   4.01              吳政忠
## 3245   4.10              張正憲
## 3246   4.06                李雨
## 3247   4.15              李世光
## 3248   4.07              朱錦洲
## 3249   4.05              劉佩玲
## 3250   4.09              胡文聰
## 3251   3.97              沈弘俊
## 3252   4.00              張培仁
## 3253   4.06              陳兆勛
## 3254   3.96              王安邦
## 3255   4.05              舒貽忠
## 3256   3.99              陳國慶
## 3257   4.01              趙聖德
## 3258   3.94              陳瑞琳
## 3259   4.05              黃榮山
## 3260   4.04              陳建彰
## 3261   4.08              翁宗賢
## 3262   3.98              周逸儒
## 3263   4.04              江宏仁
## 3264   4.04              許聿翔
## 3265   4.09              陳建甫
## 3266   4.08              李尉彰
## 3267   3.08              張正憲
## 3268   3.38              周逸儒
## 3269   3.46              張培仁
## 3270   3.37              翁宗賢
## 3271   3.60              胡文聰
## 3272   3.51              黃榮山
## 3273   3.61              陳國慶
## 3274   3.79              江宏仁
## 3275   3.23              陳建甫
## 3276   3.80              王立昇
## 3277   3.61              陳瑞琳
## 3278   3.45              陳建彰
## 3279   2.72              劉佩玲
## 3280   3.59              郭茂坤
## 3281   3.68              陳兆勛
## 3282   3.95              許聿翔
## 3283   3.87              吳政忠
## 3284   3.28                李雨
## 3285   3.49              邵耀華
## 3286   3.80              江宏仁
## 3287   4.08              黃君偉
## 3288   3.35              舒貽忠
## 3289   2.93              朱錦洲
## 3290   3.71              王安邦
## 3291   3.76              王安邦
## 3292   0.50                    
## 3293   4.00              畢恆達
## 3294   1.48                    
## 3295   3.65              康旻杰
## 3296   3.92              陳育貞
## 3297   3.94              黃舒楣
## 3298   3.96              賴仕堯
## 3299   3.65              畢恆達
## 3300   3.66              陳亮全
## 3301   3.26              王志弘
## 3302   3.91              王志弘
## 3303   3.50              陳良治
## 3304   3.86              康旻杰
## 3305   0.00                    
## 3306   3.75              周雍強
## 3307   3.59              陳正剛
## 3308   3.77              王銘宗
## 3309   2.93              楊烽正
## 3310   2.67              洪一薰
## 3311   4.24              吳政鴻
## 3312   4.04              吳文方
## 3313   4.06              張時中
## 3314   4.00              陳達仁
## 3315   2.65                    
## 3316   3.47              王銘宗
## 3317   3.71              楊烽正
## 3318   3.76              周雍強
## 3319   3.92              陳正剛
## 3320   3.96              黃漢邦
## 3321   4.18              郭瑞祥
## 3322   3.92              吳文方
## 3323   3.69              陳達仁
## 3324   4.18              蔣明晃
## 3325   4.16              吳政鴻
## 3326   4.04              洪一薰
## 3327   4.11              黃奎隆
## 3328   4.00              林智仁
## 3329   4.00              張時中
## 3330   3.67              楊烽正
## 3331   3.97              楊烽正
## 3332   3.51              洪一薰
## 3333   3.55              黃奎隆
## 3334   3.66              吳文方
## 3335   3.44              陳正剛
## 3336   1.35                    
## 3337   3.77              林峰輝
## 3338   4.07              黃義侑
## 3339   3.85              楊台鴻
## 3340   3.94              章良渭
## 3341   3.73              王兆麟
## 3342   4.04              呂東武
## 3343   3.75              林啟萬
## 3344   4.15              趙福杉
## 3345   4.04              林文澧
## 3346   3.68              謝銘鈞
## 3347   3.92              陳中明
## 3348   3.88              翁昭旼
## 3349   4.10              林發暄
## 3350   4.12              林頌然
## 3351   3.44              趙本秀
## 3352   3.88              趙本秀
## 3353   2.93                    
## 3354   3.98              林峰輝
## 3355   4.11              黃義侑
## 3356   3.83              楊台鴻
## 3357   4.04              章良渭
## 3358   3.82              王兆麟
## 3359   4.03              呂東武
## 3360   3.66              林啟萬
## 3361   4.11              趙福杉
## 3362   3.98              林文澧
## 3363   3.83              謝銘鈞
## 3364   3.87              陳中明
## 3365   3.99              翁昭旼
## 3366   3.99              林發暄
## 3367   3.73              林頌然
## 3368   3.92              趙本秀
## 3369   3.89              陳中明
## 3370   3.80              楊台鴻
## 3371   3.72              陳中明
## 3372   3.83              趙福杉
## 3373   3.52              林發暄
## 3374   3.73              林啟萬
## 3375   3.75              林文澧
## 3376   3.75              林文澧
## 3377   3.88              呂東武
## 3378   3.96              章良渭
## 3379   3.96              呂東武
## 3380   3.65              章良渭
## 3381   4.15              章良渭
## 3382   3.29              曾文毅
## 3383   3.92              林發暄
## 3384   3.50              林頌然
## 3385   4.04              林頌然
## 3386   4.01              林發暄
## 3387   3.62              王兆麟
## 3388   3.57              林峰輝
## 3389   0.59                    
## 3390   4.11              林江珍
## 3391   4.30              劉貴生
## 3392   3.64              徐善慧
## 3393   4.22              童世煌
## 3394   4.15              鄭如忠
## 3395   4.15              陳文章
## 3396   4.20              林江珍
## 3397   3.72              徐善慧
## 3398   4.30              童世煌
## 3399   4.30              鄭如忠
## 3400   2.99                    
## 3401   3.80              賴育英
## 3402   3.93              黃慶怡
## 3403   3.53              童世煌
## 3404   4.30              林江珍
## 3405   3.75              劉貴生
## 3406   4.00              鄭如忠
## 3407   3.92              鄭如忠
## 3408   3.97              徐善慧
## 3409   4.23              劉貴生
## 3410   4.23              黃慶怡
## 3411   3.65              徐善慧
## 3412   4.22              童世煌
## 3413   4.24              鄭如忠
## 3414   4.00              陳文章
## 3415   4.00              徐治平
## 3416   4.30              廖文彬
## 3417   4.10              賴育英
## 3418   4.15              何國川
## 3419   4.30              林俊彬
## 3420   4.21              林江珍
## 3421   3.52              徐善慧
## 3422   2.99              黃文達
## 3423   3.62              王淑珍
## 3424   3.97              林淑怡
## 3425   3.98              丁詩同
## 3426   3.86              官俊榮
## 3427   3.77              陳政位
## 3428   3.67              黃文達
## 3429   3.82              葉德銘
## 3430   3.67              黃文達
## 3431   3.59              賴喜美
## 3432   3.91              李允中
## 3433   3.87              林淑怡
## 3434   3.61              陳世銘
## 3435   3.86              蔡明哲
## 3436   3.85              王淑珍
## 3437   3.99              林淑怡
## 3438   4.01              丁詩同
## 3439   3.79              黃文達
## 3440   3.94              葉德銘
## 3441   3.89              黃文達
## 3442   3.70              賴喜美
## 3443   3.99              李允中
## 3444   3.97              林淑怡
## 3445   3.58              陳世銘
## 3446   3.95              蔡明哲
## 3447   2.45              陳凱儀
## 3448   3.33              廖振鐸
## 3449   3.43              蔡政安
## 3450   3.36              常玉強
## 3451   3.41              陳凱儀
## 3452   3.33              陳凱儀
## 3453   2.70              張孟基
## 3454   3.42              莊汶博
## 3455   3.32              林順福
## 3456   3.64              蔡欣甫
## 3457   3.72              蔡欣甫
## 3458   3.11              胡明哲
## 3459   3.07              余化龍
## 3460   3.09              胡明哲
## 3461   3.32              胡明哲
## 3462   3.86              廖秀娟
## 3463   3.85              廖秀娟
## 3464   2.99              余化龍
## 3465   3.10              許少瑜
## 3466   2.54              任秀慧
## 3467   3.22              謝正義
## 3468   3.14              范正成
## 3469   3.47              黃宏斌
## 3470   0.00              劉振宇
## 3471   4.00              張尊國
## 3472   3.91              范正成
## 3473   3.95              吳富春
## 3474   3.98              譚義績
## 3475   4.00              張文亮
## 3476   3.65              蘇明道
## 3477   3.72              鄭克聲
## 3478   4.05              任秀慧
## 3479   4.27              童慶斌
## 3480   4.17              侯文祥
## 3481   4.04              張倉榮
## 3482   4.30              林裕彬
## 3483   3.56              謝正義
## 3484   4.12              廖秀娟
## 3485   4.22              余化龍
## 3486   4.09              胡明哲
## 3487   4.20              黃國倉
## 3488   2.80              李佳音
## 3489   3.62              林乃君
## 3490   3.66              林乃君
## 3491   3.11              陳佩貞
## 3492   3.28              蘇南維
## 3493   3.33              洪傳揚
## 3494   3.70              洪傳揚
## 3495   3.73              洪傳揚
## 3496   3.82              徐駿森
## 3497   4.30              陳尊賢
## 3498   3.70              李達源
## 3499   4.00              李佳音
## 3500   4.30              顏瑞泓
## 3501   4.00              賴喜美
## 3502   4.10              黃良得
## 3503   3.99              王尚禮
## 3504   4.30              施養信
## 3505   4.00              許正一
## 3506   4.00              徐駿森
## 3507   3.90              吳蕙芬
## 3508   4.10              林乃君
## 3509   4.06              陳佩貞
## 3510   3.89              羅凱尹
## 3511   2.71              王立志
## 3512   2.67              鍾國芳
## 3513   3.51              鄭智馨
## 3514   3.17              林法勤
## 3515   3.91              蔡明哲
## 3516   3.05              袁孝維
## 3517   4.10              蔡明哲
## 3518   4.02              蔡明哲
## 3519   4.08              蔡明哲
## 3520   4.07              蔡明哲
## 3521   4.09              蔡明哲
## 3522   4.06              蔡明哲
## 3523   3.95              盧道杰
## 3524   2.71              邱祈榮
## 3525   3.30              鹿兒陽
## 3526   3.01              陳明杰
## 3527   3.84              丁宗蘇
## 3528   3.67              梁偉立
## 3529   3.69              葉汀峰
## 3530   3.54              林增毅
## 3531   4.00              曲芳華
## 3532   4.15              邱祈榮
## 3533   4.30              蔡明哲
## 3534   3.35              柯淳涵
## 3535   4.00              盧道杰
## 3536   4.00              丁宗蘇
## 3537   4.10              曲芳華
## 3538   3.57              林法勤
## 3539   4.30              葉汀峰
## 3540   4.30            久米朋宣
## 3541   4.00              張豐丞
## 3542   4.00              余家斌
## 3543   3.55              余家斌
## 3544   3.32              王佩華
## 3545   3.94              王佩華
## 3546   3.75              魏恒巍
## 3547   3.53              林美峰
## 3548   3.54              鍾德憲
## 3549   3.84              吳兩新
## 3550   4.18              陳明汝
## 3551   4.30              丁詩同
## 3552   4.06              邱智賢
## 3553   4.00        劉<U+569E>睿
## 3554   4.04              王佩華
## 3555   4.10              吳信志
## 3556   4.21              陳億乘
## 3557   4.13              朱有田
## 3558   4.27              陳靜宜
## 3559   4.00              林美峰
## 3560   4.22              鍾德憲
## 3561   4.08              林恩仲
## 3562   4.28              魏恒巍
## 3563   4.22              劉逸軒
## 3564   3.96              蘇忠楨
## 3565   3.65              吳兩新
## 3566   4.00              徐濟泰
## 3567   4.10              陳明汝
## 3568   4.30              丁詩同
## 3569   3.85              邱智賢
## 3570   4.05        劉<U+569E>睿
## 3571   4.23              王佩華
## 3572   4.04              吳信志
## 3573   4.25              陳億乘
## 3574   4.04              朱有田
## 3575   4.30              陳靜宜
## 3576   3.78              林美峰
## 3577   4.26              鍾德憲
## 3578   4.30              魏恒巍
## 3579   4.30              劉逸軒
## 3580   4.18              蘇忠楨
## 3581   3.48              邱智賢
## 3582   3.52              邱智賢
## 3583   3.24              林恩仲
## 3584   3.46              魏恒巍
## 3585   3.36              吳兩新
## 3586   3.28              陳靜宜
## 3587   3.92              鍾德憲
## 3588   3.74              蘇忠楨
## 3589   3.50              林美峰
## 3590   3.79              吳兩新
## 3591   3.72              蘇忠楨
## 3592   2.72              劉逸軒
## 3593   3.95              陳靜宜
## 3594   3.22              官俊榮
## 3595   3.19              陳郁蕙
## 3596   3.60              陸怡蕙
## 3597   3.19              羅竹平
## 3598   4.01              吳榮杰
## 3599   3.52              陳政位
## 3600   3.50              曾偉君
## 3601   3.71              吳榮杰
## 3602   3.51              徐世勳
## 3603   3.51                陸雲
## 3604   3.61              吳珮瑛
## 3605   3.63              吳珮瑛
## 3606   3.84              張耀乾
## 3607   3.53              鄭佳昆
## 3608   3.66              鄭佳昆
## 3609   3.33              陳右人
## 3610   3.80              陳右人
## 3611   3.39                許輔
## 3612   3.70              吳思節
## 3613   3.61              林寶秀
## 3614   3.50              林晏州
## 3615   3.70              陳惠美
## 3616   3.69              李國譚
## 3617   3.17              鄭佳昆
## 3618   4.03              鄭佳昆
## 3619   3.67              林寶秀
## 3620   3.10              許富鈞
## 3621   2.89              許富鈞
## 3622   3.76              羅筱鳳
## 3623   3.68              杜宜殷
## 3624   3.56              張俊彥
## 3625   3.64              陳惠美
## 3626   3.81              鄭佳昆
## 3627   2.89              林寶秀
## 3628   4.30              吳俊達
## 3629   3.00              陳惠美
## 3630   4.00              鄭佳昆
## 3631   4.30              林淑怡
## 3632   4.15              林書妍
## 3633   3.12              周崇熙
## 3634   3.09              周崇熙
## 3635   1.97              蕭逸澤
## 3636   2.07              蕭逸澤
## 3637   2.98              蕭逸澤
## 3638   3.07              蕭逸澤
## 3639   3.02              李建穀
## 3640   2.81              李建穀
## 3641   4.00              張芳嘉
## 3642   3.92              張芳嘉
## 3643   3.19              王汎熒
## 3644   3.27              王汎熒
## 3645   3.87              武敬和
## 3646   3.87              武敬和
## 3647   3.05              陳慧文
## 3648   3.28              陳慧文
## 3649   2.75              張紹光
## 3650   2.88              張紹光
## 3651   3.59              鄭益謙
## 3652   3.09              張紹光
## 3653   3.15              張紹光
## 3654   2.67              蘇璧伶
## 3655   2.76              蘇璧伶
## 3656   3.63              蘇璧伶
## 3657   3.62              蘇璧伶
## 3658   3.48              蔡沛學
## 3659   3.62              蔡沛學
## 3660   3.22              武敬和
## 3661   3.85              黃慧璧
## 3662   3.95                龐飛
## 3663   4.30              張紹光
## 3664   4.00              鄭謙仁
## 3665   4.18              蔡向榮
## 3666   4.13              季昭華
## 3667   3.48              蘇璧伶
## 3668   4.00              李繼忠
## 3669   3.70              萬灼華
## 3670   4.20              張芳嘉
## 3671   4.30              周崇熙
## 3672   4.17              林辰栖
## 3673   4.18              王儷蒨
## 3674   4.00              李雅珍
## 3675   4.30              陳慧文
## 3676   4.30              武敬和
## 3677   3.36              蔡向榮
## 3678   3.86              李繼忠
## 3679   3.79              李繼忠
## 3680   3.88              周晉澄
## 3681   3.80              周晉澄
## 3682   3.81                龐飛
## 3683   3.76                龐飛
## 3684   3.60              蔡向榮
## 3685   3.56              武敬和
## 3686   4.00              鄭謙仁
## 3687   4.00              萬灼華
## 3688   4.30              張芳嘉
## 3689   4.20              周崇熙
## 3690   4.22              林辰栖
## 3691   4.15              王儷蒨
## 3692   3.76              武敬和
## 3693   3.75              陳炳宏
## 3694   3.55              周穆謙
## 3695   3.95              闕河嘉
## 3696   4.09              王淑美
## 3697   3.68              闕河嘉
## 3698   4.10              周穆謙
## 3699   3.60              黃振康
## 3700   3.38              郭彥甫
## 3701   2.84              江昭皚
## 3702   2.40              陳世芳
## 3703   2.93              李允中
## 3704   3.00              朱元南
## 3705   3.10              陳世銘
## 3706   3.50              李允中
## 3707   3.30              鄭宗記
## 3708   3.30              廖國基
## 3709   3.45              顏炳郎
## 3710   3.40              黃振康
## 3711   3.27              侯詠德
## 3712   3.39              郭彥甫
## 3713   3.51              陳洵毅
## 3714   2.62              黃振康
## 3715   1.92              廖國基
## 3716   3.08              黃振康
## 3717   3.52              葉仲基
## 3718   4.05              陳世銘
## 3719   3.92              林達德
## 3720   4.00              朱元南
## 3721   3.92              周瑞仁
## 3722   4.00                方煒
## 3723   3.57              李允中
## 3724   4.09              周楚洋
## 3725   3.38              葉仲基
## 3726   4.06              陳力騏
## 3727   3.85              江昭皚
## 3728   4.14              鄭宗記
## 3729   4.02              陳倩瑜
## 3730   3.83              陳林祈
## 3731   3.70              黃振康
## 3732   3.76              周呈霙
## 3733   3.92              廖國基
## 3734   3.82              盧彥文
## 3735   3.98              顏炳郎
## 3736   3.83              郭彥甫
## 3737   3.67              陳洵毅
## 3738   4.30              侯詠德
## 3739   4.30              謝博全
## 3740   4.00              陳世銘
## 3741   4.12              林達德
## 3742   3.13              朱元南
## 3743   3.53              周瑞仁
## 3744   3.26              李允中
## 3745   3.56              周楚洋
## 3746   3.60              葉仲基
## 3747   2.33              陳力騏
## 3748   3.99              江昭皚
## 3749   4.30              鄭宗記
## 3750   4.06              陳倩瑜
## 3751   4.22              陳林祈
## 3752   3.91              黃振康
## 3753   2.46              周呈霙
## 3754   3.17              廖國基
## 3755   3.74              盧彥文
## 3756   3.71              顏炳郎
## 3757   3.85              郭彥甫
## 3758   2.40              陳洵毅
## 3759   4.00              侯詠德
## 3760   3.33              蔡志偉
## 3761   3.74              蔡志偉
## 3762   3.84              李後晶
## 3763   3.11              許如君
## 3764   3.79              張俊哲
## 3765   3.06              黃榮南
## 3766   2.08              蕭旭峰
## 3767   2.95              蕭旭峰
## 3768   3.30              楊恩誠
## 3769   3.53              楊恩誠
## 3770   3.34              楊恩誠
## 3771   4.11              柯俊成
## 3772   3.58              蕭旭峰
## 3773   4.15              黃榮南
## 3774   4.04              許如君
## 3775   3.75            奧山利規
## 3776   3.65              吳岳隆
## 3777   4.00              李後晶
## 3778   4.00              黃榮南
## 3779   4.00              許如君
## 3780   4.00            奧山利規
## 3781   3.28              蔡志偉
## 3782   3.21              沈湯龍
## 3783   3.42              孫岩章
## 3784   3.12              林長平
## 3785   3.57              沈偉強
## 3786   3.02              陳穎練
## 3787   3.34              陳昭瑩
## 3788   0.79                    
## 3789   3.89              林順福
## 3790   4.17              蔡欣甫
## 3791   2.77                    
## 3792   3.72              林順福
## 3793   4.11              蔡欣甫
## 3794   3.13              張孟基
## 3795   3.74              胡凱康
## 3796   3.76              蔡政安
## 3797   3.07              蔡政安
## 3798   2.67              張孟基
## 3799   2.86              林彥蓉
## 3800   3.69              王淑珍
## 3801   3.65              林順福
## 3802   3.99              王裕文
## 3803   3.96              劉力瑜
## 3804   4.08              黃文達
## 3805   3.75              廖振鐸
## 3806   0.79                    
## 3807   4.05              胡明哲
## 3808   4.15              范正成
## 3809   3.94              陳萱芳
## 3810   2.45                    
## 3811   3.79              任秀慧
## 3812   3.96              黃國倉
## 3813   3.73              謝正義
## 3814   4.00              范致豪
## 3815   4.10              黃宏斌
## 3816   4.03              許銘熙
## 3817   4.03              張尊國
## 3818   4.20              范正成
## 3819   4.30              張斐章
## 3820   4.10              劉振宇
## 3821   4.00              鄭克聲
## 3822   4.00              張文亮
## 3823   4.10              蘇明道
## 3824   4.15              廖中明
## 3825   4.09              譚義績
## 3826   4.30              童慶斌
## 3827   4.19              張倉榮
## 3828   4.27              林裕彬
## 3829   4.25              侯文祥
## 3830   4.19              廖秀娟
## 3831   3.92              謝正義
## 3832   4.20              余化龍
## 3833   4.23              任秀慧
## 3834   4.24              胡明哲
## 3835   4.06              黃國倉
## 3836   4.11              張倉榮
## 3837   3.93              譚義績
## 3838   4.03              侯文祥
## 3839   3.67              黃國倉
## 3840   3.14              童慶斌
## 3841   3.88              黃宏斌
## 3842   3.96              侯文祥
## 3843   3.76              廖秀娟
## 3844   3.53              謝正義
## 3845   4.08              賴進松
## 3846   3.66              蘇明道
## 3847   3.90              鄭克聲
## 3848   2.64              吳富春
## 3849   4.13              林裕彬
## 3850   3.86              侯文祥
## 3851   0.69                    
## 3852   3.99              許正一
## 3853   3.99              李佳音
## 3854   4.00              李達源
## 3855   4.15              顏瑞泓
## 3856   4.20              賴喜美
## 3857   4.00              黃良得
## 3858   4.20              蘇南維
## 3859   3.85              王尚禮
## 3860   4.20              施養信
## 3861   4.15              許正一
## 3862   3.90              徐駿森
## 3863   4.30              林乃君
## 3864   4.30              陳佩貞
## 3865   4.00              李達源
## 3866   4.00              李佳音
## 3867   4.00              顏瑞泓
## 3868   4.30              賴喜美
## 3869   4.00              黃良得
## 3870   4.00              蘇南維
## 3871   4.30              王尚禮
## 3872   4.30              洪傳揚
## 3873   4.00              徐駿森
## 3874   4.30              吳蕙芬
## 3875   4.30              林乃君
## 3876   4.00              陳佩貞
## 3877   3.33                    
## 3878   3.92              許正一
## 3879   3.99              吳蕙芬
## 3880   4.11              陳尊賢
## 3881   3.88              李達源
## 3882   4.04              李佳音
## 3883   4.08              顏瑞泓
## 3884   4.22              賴喜美
## 3885   3.94              黃良得
## 3886   4.09              蘇南維
## 3887   4.18              王尚禮
## 3888   4.08              施養信
## 3889   4.06              許正一
## 3890   4.12              洪傳揚
## 3891   4.13              徐駿森
## 3892   4.08              吳蕙芬
## 3893   3.95              林乃君
## 3894   4.15              陳佩貞
## 3895   4.04              羅凱尹
## 3896   4.01              洪傳揚
## 3897   3.99              洪傳揚
## 3898   4.23              施養信
## 3899   3.69              丁一倪
## 3900   3.95              王尚禮
## 3901   3.56              賴喜美
## 3902   3.40              顏瑞泓
## 3903   3.86              李達源
## 3904   3.94              陳尊賢
## 3905   4.04              王尚禮
## 3906   4.07              何聖賓
## 3907   4.08              賴喜美
## 3908   3.47              吳蕙芬
## 3909   3.37              黃良得
## 3910   4.05              施養信
## 3911   4.04              羅凱尹
## 3912   0.23                    
## 3913   3.91              袁孝維
## 3914   4.10              蔡明哲
## 3915   3.79              盧道杰
## 3916   4.10              鍾國芳
## 3917   3.83              曲芳華
## 3918   1.51                    
## 3919   3.95              袁孝維
## 3920   3.69            久米朋宣
## 3921   3.82              蔡明哲
## 3922   3.85              劉奇璋
## 3923   3.99              關秉宗
## 3924   4.00              張上鎮
## 3925   3.70              鄭欽龍
## 3926   3.88              袁孝維
## 3927   3.50              王立志
## 3928   4.00              邱祈榮
## 3929   4.05              蔡明哲
## 3930   3.79              柯淳涵
## 3931   3.85              盧道杰
## 3932   4.09              丁宗蘇
## 3933   4.10              曲芳華
## 3934   3.90              張惠婷
## 3935   3.91              林法勤
## 3936   4.07              鄭智馨
## 3937   4.05              鍾國芳
## 3938   4.13              葉汀峰
## 3939   4.18            久米朋宣
## 3940   3.63              張豐丞
## 3941   4.00              余家斌
## 3942   3.70              林增毅
## 3943   4.02              陳明杰
## 3944   3.75              盧道杰
## 3945   3.82              張上鎮
## 3946   3.79              鹿兒陽
## 3947   4.06              蔡明哲
## 3948   4.17              曲芳華
## 3949   4.22            久米朋宣
## 3950   4.05              梁偉立
## 3951   3.78              關秉宗
## 3952   4.10              葉汀峰
## 3953   4.00              余家斌
## 3954   4.00              張豐丞
## 3955   3.91              柯淳涵
## 3956   3.84              盧道杰
## 3957   3.56              林法勤
## 3958   3.53              鄭智馨
## 3959   3.81              葉汀峰
## 3960   4.14            久米朋宣
## 3961   3.83              梁偉立
## 3962   3.51              袁孝維
## 3963   3.33              袁孝維
## 3964   3.51              張豐丞
## 3965   0.99                    
## 3966   3.88              吳兩新
## 3967   3.75              邱智賢
## 3968   3.80              王佩華
## 3969   3.61              陳億乘
## 3970   3.32              林美峰
## 3971   3.31              林恩仲
## 3972   3.76              陳靜宜
## 3973   3.59              吳信志
## 3974   4.00              丁詩同
## 3975   3.94              吳兩新
## 3976   3.23                    
## 3977   3.76              吳信志
## 3978   4.04              徐濟泰
## 3979   3.85              陳明汝
## 3980   3.57              吳信志
## 3981   4.11        劉<U+569E>睿
## 3982   3.80              蘇忠楨
## 3983   3.86              劉逸軒
## 3984   3.43              蘇忠楨
## 3985   3.97              陳億乘
## 3986   3.78              徐濟泰
## 3987   3.98              鍾德憲
## 3988   0.60                    
## 3989   3.83              顏子儀
## 3990   4.06              徐世勳
## 3991   3.25                    
## 3992   3.82              黃芳玫
## 3993   3.66              吳榮杰
## 3994   3.07              黃芳玫
## 3995   3.54              賴志芳
## 3996   3.85              陳政位
## 3997   3.64              張靜貞
## 3998   4.16              顏建賢
## 3999   4.24              雷立芬
## 4000   4.00              徐世勳
## 4001   4.00              陸怡蕙
## 4002   4.15              吳珮瑛
## 4003   4.00              吳珮瑛
## 4004   4.00              吳珮瑛
## 4005   4.00              吳榮杰
## 4006   4.06              官俊榮
## 4007   4.13              徐世勳
## 4008   3.98              雷立芬
## 4009   4.00              陳郁蕙
## 4010   4.09              陸怡蕙
## 4011   4.00              陳政位
## 4012   4.03              黃芳玫
## 4013   4.00              黃芳玫
## 4014   4.08              黃芳玫
## 4015   4.15              張宏浩
## 4016   4.02              羅竹平
## 4017   4.23              張靜貞
## 4018   4.08              吳珮瑛
## 4019   4.01              吳榮杰
## 4020   4.30              徐世勳
## 4021   4.00              陳郁蕙
## 4022   4.30              陳政位
## 4023   3.83              陳政位
## 4024   3.35              陸怡蕙
## 4025   4.03              雷立芬
## 4026   3.69              陳郁蕙
## 4027   4.08                李浡
## 4028   4.12              陳政位
## 4029   3.84              雷立芬
## 4030   4.00              顏子儀
## 4031   3.18              黃芳玫
## 4032   3.99              陳政位
## 4033   3.88              陸怡蕙
## 4034   4.11              吳榮杰
## 4035   4.04              吳珮瑛
## 4036   3.72              雷立芬
## 4037   3.86              徐世勳
## 4038   3.81              楊之遠
## 4039   0.51                    
## 4040   3.98              葉德銘
## 4041   3.93                許輔
## 4042   3.89              林寶秀
## 4043   4.08              許富鈞
## 4044   4.06              吳思節
## 4045   4.30              林寶秀
## 4046   4.00              杜宜殷
## 4047   4.22              林晏州
## 4048   4.00              徐源泰
## 4049   4.10              張育森
## 4050   4.22              葉德銘
## 4051   4.00              張俊彥
## 4052   4.30              羅筱鳳
## 4053   4.30                許輔
## 4054   4.00              陳右人
## 4055   4.06              張耀乾
## 4056   3.85              杜宜殷
## 4057   4.30              吳俊達
## 4058   4.30              鄭佳昆
## 4059   3.57              吳思節
## 4060   4.00              許富鈞
## 4061   4.30              林書妍
## 4062   4.30              林晏州
## 4063   4.30              徐源泰
## 4064   4.30              張育森
## 4065   4.10              葉德銘
## 4066   4.00              張俊彥
## 4067   4.00              陳右人
## 4068   4.00              張耀乾
## 4069   4.10              楊雯如
## 4070   4.30              陳惠美
## 4071   4.30              鄭佳昆
## 4072   4.00              林寶秀
## 4073   4.00              吳思節
## 4074   3.85              許富鈞
## 4075   1.99                    
## 4076   3.83              楊雯如
## 4077   3.74              徐源泰
## 4078   3.62              林寶秀
## 4079   3.77              張耀乾
## 4080   3.86              陳右人
## 4081   3.86              吳思節
## 4082   3.70              林寶秀
## 4083   3.87              林淑怡
## 4084   3.80              陳右人
## 4085   3.91              林淑怡
## 4086   3.93              張耀乾
## 4087   3.91              陳惠美
## 4088   4.30              林晏州
## 4089   3.94              徐源泰
## 4090   4.07              張育森
## 4091   4.09              葉德銘
## 4092   4.06              張俊彥
## 4093   4.04              羅筱鳳
## 4094   3.83                許輔
## 4095   4.10              陳右人
## 4096   3.89              張耀乾
## 4097   3.59              杜宜殷
## 4098   3.81              楊雯如
## 4099   3.93              吳俊達
## 4100   4.05              陳惠美
## 4101   3.86              鄭佳昆
## 4102   3.86              林淑怡
## 4103   3.97              林寶秀
## 4104   3.93              吳思節
## 4105   3.74              許富鈞
## 4106   3.93              林書妍
## 4107   4.03              李金龍
## 4108   4.30              林晏州
## 4109   4.10              徐源泰
## 4110   4.02              張育森
## 4111   4.19              葉德銘
## 4112   4.00              張俊彥
## 4113   3.92              羅筱鳳
## 4114   3.87                許輔
## 4115   4.02              陳右人
## 4116   4.00              張耀乾
## 4117   3.90              杜宜殷
## 4118   3.50              楊雯如
## 4119   3.86              吳俊達
## 4120   4.04              陳惠美
## 4121   4.13              鄭佳昆
## 4122   3.88              林淑怡
## 4123   4.05              林寶秀
## 4124   3.84              吳思節
## 4125   4.10              林書妍
## 4126   4.02              李金龍
## 4127   3.78              鄭佳昆
## 4128   3.89              陳右人
## 4129   4.11              曾文聖
## 4130   4.11              曾文聖
## 4131   3.34              吳俊達
## 4132   3.64              張祖亮
## 4133   3.74              黃鵬林
## 4134   3.90              楊雯如
## 4135   3.68              葉德銘
## 4136   3.59              杜宜殷
## 4137   3.71              吳俊達
## 4138   3.39              林寶秀
## 4139   3.45              鄭佳昆
## 4140   3.58              陳右人
## 4141   3.54              張育森
## 4142   4.15              張俊彥
## 4143   0.75                    
## 4144   4.00              周晉澄
## 4145   4.10              周晉澄
## 4146   4.30              周晉澄
## 4147   4.30              季昭華
## 4148   3.70              詹東榮
## 4149   4.00              周崇熙
## 4150   4.30              陳慧文
## 4151   3.70              詹東榮
## 4152   3.98              周晉澄
## 4153   2.51                    
## 4154   3.53              周晉澄
## 4155   4.20              陳媺玫
## 4156   4.06              蔡向榮
## 4157   3.68              詹東榮
## 4158   4.10              張芳嘉
## 4159   4.05              周崇熙
## 4160   4.18              鄭益謙
## 4161   3.68              廖泰慶
## 4162   4.30              林辰栖
## 4163   4.30              陳慧文
## 4164   4.17              陳媺玫
## 4165   3.60              詹東榮
## 4166   3.95              張芳嘉
## 4167   4.12              周崇熙
## 4168   4.00              鄭益謙
## 4169   3.76              廖泰慶
## 4170   4.30              葉光勝
## 4171   4.22              林辰栖
## 4172   3.79              張芳嘉
## 4173   3.30              張芳嘉
## 4174   3.96              周崇熙
## 4175   4.08              周崇熙
## 4176   3.60              詹東榮
## 4177   4.03              葉光勝
## 4178   3.78              周崇熙
## 4179   3.97              季昭華
## 4180   3.75              洪志遠
## 4181   4.09              林辰栖
## 4182   3.65              費昌勇
## 4183   3.52              李繼忠
## 4184   3.78              王儷蒨
## 4185   3.91              葉光勝
## 4186   3.70              葉光勝
## 4187   4.01              劉以立
## 4188   3.22              李雅珍
## 4189   0.69                    
## 4190   4.04              彭立沛
## 4191   1.59                    
## 4192   4.08              彭立沛
## 4193   3.71              王俊豪
## 4194   3.71              邱玉蟬
## 4195   4.00              黃麗君
## 4196   4.03              陳玉華
## 4197   4.00              王俊豪
## 4198   3.77              陳玉華
## 4199   3.88              邱玉蟬
## 4200   1.44                    
## 4201   4.02              鄭宗記
## 4202   4.10              陳世銘
## 4203   4.15              林達德
## 4204   4.11              朱元南
## 4205   4.13                方煒
## 4206   3.89              李允中
## 4207   4.24              周楚洋
## 4208   4.28              葉仲基
## 4209   4.27              陳力騏
## 4210   4.15              江昭皚
## 4211   3.81              鄭宗記
## 4212   4.30              陳倩瑜
## 4213   4.11              陳林祈
## 4214   4.30              黃振康
## 4215   3.35              盧彥文
## 4216   4.30              顏炳郎
## 4217   3.94              郭彥甫
## 4218   4.30              侯詠德
## 4219   4.08              鄭宗記
## 4220   3.34                    
## 4221   3.70              鄭宗記
## 4222   4.23              陳世銘
## 4223   3.97              林達德
## 4224   4.05              朱元南
## 4225   3.97              周瑞仁
## 4226   3.79                方煒
## 4227   4.00              李允中
## 4228   4.19              周楚洋
## 4229   4.28              葉仲基
## 4230   4.30              陳力騏
## 4231   4.15              江昭皚
## 4232   4.18              鄭宗記
## 4233   4.05              陳倩瑜
## 4234   4.04              陳林祈
## 4235   4.04              黃振康
## 4236   4.02              周呈霙
## 4237   4.03              廖國基
## 4238   4.22              盧彥文
## 4239   4.11              顏炳郎
## 4240   4.06              郭彥甫
## 4241   3.95              陳洵毅
## 4242   4.30              侯詠德
## 4243   4.30              謝博全
## 4244   4.30                方煒
## 4245   3.57              周呈霙
## 4246   3.77              顏炳郎
## 4247   3.98              江昭皚
## 4248   3.70              鄭宗記
## 4249   3.93              陳世銘
## 4250   3.63              周瑞仁
## 4251   4.06              周楚洋
## 4252   3.51              陳世銘
## 4253   3.58              林達德
## 4254   0.68              張俊哲
## 4255   3.87            奧山利規
## 4256   2.05              張俊哲
## 4257   3.70            奧山利規
## 4258   4.15              柯俊成
## 4259   4.08              蕭旭峰
## 4260   3.98            奧山利規
## 4261   3.84              張俊哲
## 4262   3.63              張俊哲
## 4263   3.36              蔡志偉
## 4264   2.06            奧山利規
## 4265   3.91              許如君
## 4266   3.82              張俊哲
## 4267   0.41                    
## 4268   4.05              張雅君
## 4269   2.33                    
## 4270   3.79              楊爵因
## 4271   3.17              洪挺軒
## 4272   3.39              鍾嘉綾
## 4273   3.93              許元勳
## 4274   3.97              陳昭瑩
## 4275   2.42              劉瑞芬
## 4276   3.63              孫岩章
## 4277   4.30              沈湯龍
## 4278   3.86              孫岩章
## 4279   3.84              孫岩章
## 4280   4.05              趙裕展
## 4281   3.50              沈湯龍
## 4282   4.09              張東柱
## 4283   3.53              沈立言
## 4284   0.60              呂廷璋
## 4285   4.09              陳宏彰
## 4286   4.01              陳宏彰
## 4287   4.14              潘敏雄
## 4288   3.85              呂廷璋
## 4289   2.54              呂廷璋
## 4290   3.98              丁俞文
## 4291   3.92              丁俞文
## 4292   3.79        游若<U+7BCD>
## 4293   3.87              羅翊禎
## 4294   3.85              葉安義
## 4295   3.42              蔣丙煌
## 4296   3.79              謝淑貞
## 4297   4.02              呂廷璋
## 4298   4.01              鄭光成
## 4299   3.46              鄭金寶
## 4300   3.36              許庭禎
## 4301   3.72              陳惠文
## 4302   3.57              沈立言
## 4303   3.89              陳宏彰
## 4304   3.72              陳勁初
## 4305   3.85              陳政雄
## 4306   1.22                    
## 4307   3.75              陳仁治
## 4308   3.96        劉<U+569E>睿
## 4309   3.93              李宣書
## 4310   4.08              蔡孟勳
## 4311   4.04        劉<U+569E>睿
## 4312   4.09              林劭品
## 4313   3.99              陳仁治
## 4314   3.94              宋麗英
## 4315   3.90              林詩舜
## 4316   4.11              劉啟德
## 4317   4.00              鄭光成
## 4318   3.90              李宣書
## 4319   3.95              蔡孟勳
## 4320   3.89        劉<U+569E>睿
## 4321   3.75              林劭品
## 4322   3.85              陳仁治
## 4323   3.87              宋麗英
## 4324   3.79              林詩舜
## 4325   3.94              劉啟德
## 4326   3.50              鄭光成
## 4327   4.15              劉啟德
## 4328   3.26        劉<U+569E>睿
## 4329   3.67              陳仁治
## 4330   3.14              鄭光成
## 4331   0.00                    
## 4332   3.90              李宣書
## 4333   4.05              林詩舜
## 4334   3.83              林詩舜
## 4335   4.06              鄭光成
## 4336   4.00              孫智麗
## 4337   4.00              林劭品
## 4338   4.00              李宣書
## 4339   3.70              蔡孟勳
## 4340   3.98              蔡孟勳
## 4341   1.90                    
## 4342   4.22              林中天
## 4343   4.04              蘇璧伶
## 4344   4.30              季昭華
## 4345   3.80              李繼忠
## 4346   4.00              李雅珍
## 4347   4.30              黃慧璧
## 4348   3.91              蘇璧伶
## 4349   4.30              季昭華
## 4350   3.85              李繼忠
## 4351   4.30              王儷蒨
## 4352   3.88              季昭華
## 4353   3.99              季昭華
## 4354   4.00              黃慧璧
## 4355   4.00              黃慧璧
## 4356   3.95              季昭華
## 4357   4.04              季昭華
## 4358   3.73              蘇璧伶
## 4359   3.83              蘇璧伶
## 4360   4.00              張雅珮
## 4361   2.47                    
## 4362   3.75              鄭穹翔
## 4363   3.85              鄭穹翔
## 4364   4.00              王汎熒
## 4365   4.08              劉振軒
## 4366   3.70              鄭謙仁
## 4367   4.00              萬灼華
## 4368   4.00              王汎熒
## 4369   4.10              劉振軒
## 4370   3.78              鄭謙仁
## 4371   4.30              萬灼華
## 4372   3.77              鄭謙仁
## 4373   3.85              鄭謙仁
## 4374   3.91                龐飛
## 4375   3.77                龐飛
## 4376   3.54              萬灼華
## 4377   2.18              沈偉強
## 4378   4.06              沈偉強
## 4379   4.05              沈偉強
## 4380   3.39              洪挺軒
## 4381   3.61              顏瑞泓
## 4382   3.91              孫岩章
## 4383   4.26              林乃君
## 4384   4.13              許如君
## 4385   3.78              洪挺軒
## 4386   4.05              洪挺軒
## 4387   3.78              黃裕星
## 4388   3.73              蕭旭峰
## 4389   3.57              廖振男
## 4390   3.49              郭瑞祥
## 4391   3.60              郭瑞祥
## 4392   3.55              邱奕鵬
## 4393   3.62              朱文儀
## 4394   3.39              戚樹誠
## 4395   3.48              郭佳瑋
## 4396   3.49              陳家麟
## 4397   3.60              蕭富山
## 4398   3.87              練乃華
## 4399   3.24              蔣明晃
## 4400   3.84              何愛文
## 4401   3.64              楊立偉
## 4402   3.36      <U+6EDD>西敦子
## 4403   3.29      <U+6EDD>西敦子
## 4404   3.65              尤琳蕙
## 4405   3.10              王全三
## 4406   3.00              尤琳蕙
## 4407   3.56              吳淑鈴
## 4408   2.96      <U+6EDD>西敦子
## 4409   3.22              王全三
## 4410   3.27              吳淑鈴
## 4411   3.06                張翊
## 4412   3.93              王春笙
## 4413   3.52              陳郁蕙
## 4414   3.25              陳郁蕙
## 4415   3.74                葉疏
## 4416   3.01              李艷榕
## 4417   3.22              李艷榕
## 4418   2.93              陳坤志
## 4419   2.86              陳坤志
## 4420   3.22              游啟璋
## 4421   3.19              許文馨
## 4422   3.19              許文馨
## 4423   3.46              曾智揚
## 4424   3.48              曾智揚
## 4425   3.46              高偉娟
## 4426   3.17              陳國泰
## 4427   3.39              蘇裕惠
## 4428   3.47              陳耀宗
## 4429   3.43              陳耀宗
## 4430   3.68              陳慶財
## 4431   3.24              王衍智
## 4432   3.14              林岳祥
## 4433   3.16              蔡彥卿
## 4434   3.06              劉心才
## 4435   3.04              邱顯比
## 4436   3.32              陳聖賢
## 4437   3.63              姜堯民
## 4438   3.32              陳其美
## 4439   3.39              林煜宗
## 4440   3.63              朱漢寶
## 4441   3.23              邱顯比
## 4442   3.45              陳明賢
## 4443   3.35              胡星陽
## 4444   3.52              廖咸興
## 4445   3.26              何耕宇
## 4446   3.62              張晏誠
## 4447   3.52              蘇永成
## 4448   4.01              陳明賢
## 4449   3.90              吳瑞萱
## 4450   3.53              陳明郎
## 4451   3.18              葉小蓁
## 4452   3.37              陳業寧
## 4453   3.64              陳勝源
## 4454   3.56                林筠
## 4455   3.55              胡星陽
## 4456   3.62              金成隆
## 4457   3.43              劉順仁
## 4458   3.36              周建亨
## 4459   3.58              游孝元
## 4460   3.65              謝明慧
## 4461   3.54              林俊昇
## 4462   3.49              洪瑞燦
## 4463   3.55              林麗真
## 4464   4.20              郭震坤
## 4465   3.82              許耀文
## 4466   3.76              莊正民
## 4467   3.54              李吉仁
## 4468   3.01              孔令傑
## 4469   3.27              林永松
## 4470   2.92              何建忠
## 4471   2.64              陳靜枝
## 4472   3.23              魏志平
## 4473   2.67              蔡益坤
## 4474   3.76              吳玲玲
## 4475   2.72              蔡益坤
## 4476   3.53              曹承礎
## 4477   3.10              翁崇雄
## 4478   4.00              曹承礎
## 4479   3.93              孫雅麗
## 4480   4.11              李瑞庭
## 4481   3.97              蔡益坤
## 4482   4.15              林永松
## 4483   3.72              黃明蕙
## 4484   3.85              魏志平
## 4485   4.06              盧信銘
## 4486   4.14              孔令傑
## 4487   4.04              曹承礎
## 4488   2.82              孔令傑
## 4489   3.19              黃明蕙
## 4490   0.72                    
## 4491   4.16              劉啟群
## 4492   4.03              高偉娟
## 4493   4.09              高偉娟
## 4494   2.77                    
## 4495   4.09              廖芝嫻
## 4496   3.23              陳國泰
## 4497   3.83              張明輝
## 4498   3.80              陳建文
## 4499   4.02              劉啟群
## 4500   4.19              劉嘉雯
## 4501   4.02              郭政弘
## 4502   3.81              盧聯生
## 4503   3.73              鍾聰明
## 4504   1.16                    
## 4505   4.08              陳彥行
## 4506   4.03              何耕宇
## 4507   3.90              陳聖賢
## 4508   3.23              王衍智
## 4509   3.66              陳釗而
## 4510   2.75                    
## 4511   4.30              管中閔
## 4512   4.26              王耀輝
## 4513   4.24              張晏誠
## 4514   3.56              陳其美
## 4515   3.78              李賢源
## 4516   3.80              林姿婷
## 4517   3.90              陳聖賢
## 4518   3.82              管中閔
## 4519   3.80              葉小蓁
## 4520   3.94              張森林
## 4521   3.93              傅承德
## 4522   3.71              石百達
## 4523   3.80              陳業寧
## 4524   4.17              林勳發
## 4525   4.23              王耀輝
## 4526   4.09              蕭忠仁
## 4527   4.17              蕭忠仁
## 4528   0.64                    
## 4529   3.75              陳思寬
## 4530   4.30              洪茂蔚
## 4531   4.11              莊正民
## 4532   4.05              黃恆獎
## 4533   3.77              盧信昌
## 4534   4.04              趙義隆
## 4535   3.80              陳俊忠
## 4536   3.54              邱宏仁
## 4537   2.71                    
## 4538   3.81              黃志典
## 4539   3.66              吳學良
## 4540   3.64              洪茂蔚
## 4541   4.17              許耀文
## 4542   4.12              李志偉
## 4543   3.30              趙捷謙
## 4544   3.73              邊裕淵
## 4545   3.86              王之彥
## 4546   3.43              王之彥
## 4547   3.68              邱宏仁
## 4548   3.81                鍾騏
## 4549   4.10              趙義隆
## 4550   3.58              程淑芬
## 4551   3.52              盧信昌
## 4552   0.60                    
## 4553   3.49              魏志平
## 4554   3.97              莊裕澤
## 4555   4.13              林永松
## 4556   2.37                    
## 4557   3.61              翁崇雄
## 4558   4.27              陳靜枝
## 4559   4.20              吳玲玲
## 4560   4.01              李瑞庭
## 4561   4.08              翁崇雄
## 4562   3.99              孫雅麗
## 4563   4.22              陳炳宇
## 4564   2.67              黃明蕙
## 4565   4.00              魏志平
## 4566   4.00              曹承礎
## 4567   3.89              李瑞庭
## 4568   3.10              孫雅麗
## 4569   3.62              莊裕澤
## 4570   4.13              莊裕澤
## 4571   3.85              吳玲玲
## 4572   3.94              劉靜怡
## 4573   0.81                    
## 4574   3.82              許士軍
## 4575   3.85              周善瑜
## 4576   4.06              陳忠仁
## 4577   2.71                    
## 4578   3.86              廖芝嫻
## 4579   3.90              陳家聲
## 4580   3.76              陳家聲
## 4581   4.25              簡怡雯
## 4582   4.13              許鉅秉
## 4583   3.39              蔣明晃
## 4584   3.54              江炯聰
## 4585   4.30              莊璦嘉
## 4586   3.69              廖振男
## 4587   3.87              詹文男
## 4588   3.91              朱文儀
## 4589   3.79              簡怡雯
## 4590   3.65              蔣明晃
## 4591   3.99              劉基全
## 4592   3.75              陳忠仁
## 4593   3.56              余松培
## 4594   3.76              江俊毅
## 4595   3.88              黃崇興
## 4596   3.85              游張松
## 4597   4.07              陳鴻基
## 4598   3.74              練乃華
## 4599   3.82              林文政
## 4600   3.73              江炯聰
## 4601   2.08                    
## 4602   3.98              黃俊堯
## 4603   3.73              陳坤志
## 4604   3.89              葛明伊
## 4605   3.72              張晏誠
## 4606   3.74              曹承礎
## 4607   4.07              曹承礎
## 4608   3.74              陳家麟
## 4609   3.65              謝冠雄
## 4610   3.53              許文馨
## 4611   3.83              韓廷允
## 4612   3.30              李文宗
## 4613   3.46              林先和
## 4614   4.00              黃俊豪
## 4615   3.67              鍾國彪
## 4616   3.62              李永凌
## 4617   4.02              簡國龍
## 4618   4.17              陳端容
## 4619   3.12              吳全峰
## 4620   3.97              季瑋珠
## 4621   3.45              季瑋珠
## 4622   3.68              林靖愉
## 4623   2.79              蔡詩偉
## 4624   3.83              吳章甫
## 4625   3.21              楊銘欽
## 4626   4.30              郭柏秀
## 4627   4.04              陳端容
## 4628   4.00              吳章甫
## 4629   4.00              陳雅美
## 4630   4.10              簡國龍
## 4631   3.98              黃耀輝
## 4632   3.70              林宜靜
## 4633   0.59                    
## 4634   4.00              陳保中
## 4635   3.77              楊孝友
## 4636   4.03              吳章甫
## 4637   2.25                    
## 4638   3.83              陳志傑
## 4639   3.82              陳保中
## 4640   3.89              黃盛修
## 4641   3.87              陳保中
## 4642   3.85              陳保中
## 4643   3.97              鄭尊仁
## 4644   3.88              陳志傑
## 4645   3.87        陳佳<U+5803>
## 4646   4.05              郭育良
## 4647   3.70              鄭尊仁
## 4648   3.89              楊孝友
## 4649   3.53              鄭尊仁
## 4650   3.76              陳志傑
## 4651   3.78              吳章甫
## 4652   4.01              黃耀輝
## 4653   3.82              陳保中
## 4654   3.76              陳保中
## 4655   3.92              黃耀輝
## 4656   4.01              吳焜裕
## 4657   3.84        陳佳<U+5803>
## 4658   3.96              吳焜裕
## 4659   3.78                方挺
## 4660   3.66              詹長權
## 4661   3.76              吳章甫
## 4662   0.81                    
## 4663   3.94              蔡詩偉
## 4664   3.90              蔡詩偉
## 4665   1.85                    
## 4666   3.76              蕭慧娟
## 4667   3.91              張靜文
## 4668   3.72              蔡詩偉
## 4669   3.94              林靖愉
## 4670   4.08              劉貞佑
## 4671   3.60              蔡坤憲
## 4672   3.75              王根樹
## 4673   4.08              龍世俊
## 4674   3.91              蔡詩偉
## 4675   4.00              林靖愉
## 4676   3.84              蔡坤憲
## 4677   1.69                    
## 4678   3.93              楊銘欽
## 4679   3.82              郭年真
## 4680   3.90                洪弘
## 4681   3.90              江淑瓊
## 4682   0.59                    
## 4683   3.91              陳雅美
## 4684   4.00              江東亮
## 4685   4.00              楊銘欽
## 4686   3.94              鄭守夏
## 4687   4.00              張睿詒
## 4688   4.15              鍾國彪
## 4689   3.96              鄭雅文
## 4690   4.13              董鈺琪
## 4691   4.00              陳雅美
## 4692   4.00              郭年真
## 4693   3.90              陳端容
## 4694   3.67              黃俊豪
## 4695   4.15              張書森
## 4696   4.30              張心潔
## 4697   2.05                    
## 4698   3.58              董鈺琪
## 4699   3.72              張書森
## 4700   3.95              江東亮
## 4701   4.02              鍾國彪
## 4702   4.01              張睿詒
## 4703   4.30              薛亞聖
## 4704   3.71              張睿詒
## 4705   3.96              范建得
## 4706   3.99              陳秀珠
## 4707   3.96              陳雅美
## 4708   4.20                吳帆
## 4709   3.54 RobertCharlesMyrtle
## 4710   3.68              董鈺琪
## 4711   3.95              李乃欣
## 4712   3.91              黃文鴻
## 4713   0.72                    
## 4714   4.08              方啟泰
## 4715   4.12              方啟泰
## 4716   4.00              金傳春
## 4717   3.78              蕭朱杏
## 4718   3.90        程<U+85F4>菁
## 4719   3.94              簡國龍
## 4720   3.35              陳秀熙
## 4721   3.68              陳為堅
## 4722   2.75                    
## 4723   4.10              方啟泰
## 4724   3.72              簡國龍
## 4725   3.70              林菀俞
## 4726   3.96              蕭朱杏
## 4727   3.83              李永凌
## 4728   4.09              簡國龍
## 4729   3.91              簡國龍
## 4730   3.93              季瑋珠
## 4731   3.93              簡國龍
## 4732   4.00              于明暉
## 4733   3.91              金傳春
## 4734   3.90              賴文恩
## 4735   3.94              簡國龍
## 4736   3.93              季瑋珠
## 4737   4.18              陳建煒
## 4738   4.18        程<U+85F4>菁
## 4739   3.86              陳建煒
## 4740   4.28              馬惠明
## 4741   3.79              簡國龍
## 4742   3.52              李文宗
## 4743   3.48              陳秀熙
## 4744   3.87              杜裕康
## 4745   4.10        程<U+85F4>菁
## 4746   3.20              李文宗
## 4747   4.15              方啟泰
## 4748   3.75              施惟量
## 4749   3.84              方啟泰
## 4750   3.86              林柏仲
## 4751   2.70              林先和
## 4752   3.90              林菀俞
## 4753   3.23              馮世邁
## 4754   3.26              林茂昭
## 4755   3.50              蘇柏青
## 4756   3.14              陳士元
## 4757   3.04              林坤佑
## 4758   4.08              林宗男
## 4759   3.37              陳銘憲
## 4760   3.74                王凡
## 4761   3.72              黃寶儀
## 4762   3.48              于天立
## 4763   3.72              蘇國棟
## 4764   3.96              林致廷
## 4765   3.14              謝宏昀
## 4766   2.80              周俊廷
## 4767   2.31              葉丙成
## 4768   3.03              張時中
## 4769   3.24              郭斯彥
## 4770   3.60              雷欽隆
## 4771   3.24              陳耀銘
## 4772   1.94              林晃巖
## 4773   2.69              江衍偉
## 4774   2.86              周錫增
## 4775   2.29              李峻霣
## 4776   3.78              貝蘇章
## 4777   3.13              蘇炫榮
## 4778   3.64              瞿大雄
## 4779   3.83              陳耀銘
## 4780   3.68              劉深淵
## 4781   3.39              曹恒偉
## 4782   3.58              吳宗霖
## 4783   3.23              廖婉君
## 4784   2.95              李琳山
## 4785   2.12              蘇柏青
## 4786   2.82              陳宏銘
## 4787   3.22              宋孔彬
## 4788   3.52              許源浴
## 4789   3.39              顏嗣鈞
## 4790   3.62              曾雪峰
## 4791   3.85              張璞曾
## 4792   3.43              江介宏
## 4793   3.27              魏宏宇
## 4794   3.36              林浩雄
## 4795   3.37              劉深淵
## 4796   3.43              呂良鴻
## 4797   3.40              鍾孝文
## 4798   3.57              林致廷
## 4799   3.25              吳育任
## 4800   3.33                王倫
## 4801   3.43              楊志忠
## 4802   3.31              李建模
## 4803   4.07              簡韶逸
## 4804   3.48              劉致為
## 4805   3.87              王奕翔
## 4806   3.97              陳永耀
## 4807   3.89              毛紹綱
## 4808   3.44              盧奕璋
## 4809   3.77              鄭振牟
## 4810   3.90              李百祺
## 4811   3.95              林晃巖
## 4812   3.78              李琳山
## 4813   3.33              蔡坤諭
## 4814   3.45              吳安宇
## 4815   3.60              吳肇欣
## 4816   4.30              貝蘇章
## 4817   4.25              李琳山
## 4818   4.30              李嗣涔
## 4819   4.04              許源浴
## 4820   4.30              張宏鈞
## 4821   4.30              胡振國
## 4822   4.30              李枝宏
## 4823   4.30              瞿大雄
## 4824   4.30              曹恒偉
## 4825   4.30              吳瑞北
## 4826   4.18              郭正邦
## 4827   4.30              鄭士康
## 4828   4.20              江衍偉
## 4829   4.07              傅立成
## 4830   4.00              林浩雄
## 4831   4.21              陳良基
## 4832   3.69              林茂昭
## 4833   4.08              郭斯彥
## 4834   3.97              楊志忠
## 4835   3.99              賴飛羆
## 4836   4.30              張時中
## 4837   4.05              闕志達
## 4838   4.30              陳少傑
## 4839   4.18              雷欽隆
## 4840   4.30              蔡志宏
## 4841   4.30              陳銘憲
## 4842   4.22              林清富
## 4843   4.27              劉深淵
## 4844   4.06              陳永耀
## 4845   4.20                王倫
## 4846   3.95              江簡富
## 4847   4.17              陳志宏
## 4848   4.30              劉致為
## 4849   4.15              管傑雄
## 4850   3.96              劉志文
## 4851   3.93              孫啟光
## 4852   4.09              彭隆瀚
## 4853   4.08              李百祺
## 4854   4.25              陳宏銘
## 4855   4.11              鍾孝文
## 4856   4.13              張耀文
## 4857   4.21              廖婉君
## 4858   4.22              吳安宇
## 4859   4.07                王凡
## 4860   4.30              鐘嘉德
## 4861   4.16              黃升龍
## 4862   4.22              林啟萬
## 4863   4.27              馮世邁
## 4864   4.15              吳忠幟
## 4865   4.11              吳宗霖
## 4866   4.22              林恭如
## 4867   4.22              黃天偉
## 4868   4.28              羅仁權
## 4869   4.11              呂良鴻
## 4870   4.12              陳中平
## 4871   4.26              莊曜宇
## 4872   4.15              林宗男
## 4873   4.26              李泰成
## 4874   4.30              黃寶儀
## 4875   4.09              吳志毅
## 4876   4.26              黃建璋
## 4877   3.36              李君浩
## 4878   4.15              林宗賢
## 4879   3.82              李致毅
## 4880   4.23              陳耀銘
## 4881   4.25              李心予
## 4882   4.20              蘇炫榮
## 4883   3.97              陳怡然
## 4884   3.93              簡韶逸
## 4885   4.12              林晃巖
## 4886   4.09              毛紹綱
## 4887   4.25              連豊力
## 4888   4.08              林怡成
## 4889   3.72              江介宏
## 4890   4.17              邱奕鵬
## 4891   4.30              李建模
## 4892   4.23              蔡睿哲
## 4893   4.20              陳士元
## 4894   4.20              毛明華
## 4895   4.13              黃俊郎
## 4896   4.30              蘇國棟
## 4897   4.13              魏宏宇
## 4898   3.97              葉丙成
## 4899   4.21              周錫增
## 4900   3.72              謝宏昀
## 4901   4.04              陳信樹
## 4902   4.08              黃鐘揚
## 4903   4.04              陳奕君
## 4904   4.17              吳育任
## 4905   3.95              林致廷
## 4906   3.98              曾雪峰
## 4907   4.19              林坤佑
## 4908   4.20              黃定洧
## 4909   4.12              丁建均
## 4910   4.27              盧信嘉
## 4911   4.25              蔡坤諭
## 4912   4.17              田維誠
## 4913   4.17              盧奕璋
## 4914   4.08              宋孔彬
## 4915   4.19              鄭振牟
## 4916   4.25              于天立
## 4917   4.23              周俊廷
## 4918   4.25              楊家驤
## 4919   4.16              郭柏齡
## 4920   4.06              吳肇欣
## 4921   4.04              陳和麟
## 4922   4.11              蔡永傑
## 4923   4.20              蘇柏青
## 4924   4.11              李峻霣
## 4925   4.08              黃念祖
## 4926   4.22              王奕翔
## 4927   4.17              劉宗德
## 4928   4.22              李宏毅
## 4929   4.13              陳景然
## 4930   4.26              魏安祺
## 4931   3.58              黃建璋
## 4932   3.70              陳怡然
## 4933   2.82              張智星
## 4934   3.10              蔡欣穆
## 4935   3.48              廖世偉
## 4936   3.87              歐陽明
## 4937   3.31              陳健輝
## 4938   3.26              呂育道
## 4939   3.12              林守德
## 4940   3.41              洪一平
## 4941   3.07              郭大維
## 4942   3.13              薛智文
## 4943   4.25              李琳山
## 4944   4.15              吳家麟
## 4945   4.30              傅立成
## 4946   4.00              陳文進
## 4947   3.28              陳健輝
## 4948   4.20                項潔
## 4949   3.70              賴飛羆
## 4950   4.30              陳信希
## 4951   3.98              歐陽明
## 4952   3.80            歐陽彥正
## 4953   4.08              許永真
## 4954   4.15              傅楸善
## 4955   3.80              呂育道
## 4956   4.30              郭大維
## 4957   3.85              劉邦鋒
## 4958   4.12                林風
## 4959   4.24              楊佳玲
## 4960   4.30              洪一平
## 4961   4.30              趙坤茂
## 4962   4.19              周承復
## 4963   4.24              逄愛君
## 4964   4.15              施吉昇
## 4965   4.15              莊永裕
## 4966   3.90              洪士灝
## 4967   3.93              呂學一
## 4968   4.30              薛智文
## 4969   4.00              張瑞峰
## 4970   4.15              曾宇鳳
## 4971   4.22              鄭卜壬
## 4972   4.01              林守德
## 4973   4.13              李明穗
## 4974   4.12              徐宏民
## 4975   4.26              廖世偉
## 4976   3.98              林軒田
## 4977   4.04              蔡欣穆
## 4978   4.13              陳彥仰
## 4979   4.30              李允中
## 4980   4.18              張智星
## 4981   4.00              徐慰中
## 4982   4.10              蕭旭君
## 4983   4.03                林風
## 4984   3.35              李明穗
## 4985   3.63              趙坤茂
## 4986   3.59            歐陽彥正
## 4987   1.79                    
## 4988   3.70              羅仁權
## 4989   4.11              陳景然
## 4990   3.71              雷欽隆
## 4991   2.99                    
## 4992   3.70              羅仁權
## 4993   4.09              陳景然
## 4994   3.75              雷欽隆
## 4995   3.89              胡振國
## 4996   3.87              傅立成
## 4997   3.94              莊曜宇
## 4998   3.69              王勝德
## 4999   3.55              郭正邦
## 5000   3.76              盧信嘉
## 5001   3.77              陳耀銘
## 5002   3.51              林致廷
## 5003   3.32              李致毅
## 5004   4.06              丁建均
## 5005   3.77              陳中平
## 5006   3.64              孫啟光
## 5007   3.74              張時中
## 5008   3.48              陳信樹
## 5009   3.63              蔡志宏
## 5010   4.20              陳志宏
## 5011   3.91              羅仁權
## 5012   4.22              鄭士康
## 5013   3.71              許源浴
## 5014   3.49              李峻霣
## 5015   3.68              吳肇欣
## 5016   3.78              林浩雄
## 5017   4.01              陳志宏
## 5018   3.13              蔡坤諭
## 5019   4.02              魏宏宇
## 5020   3.31              張宏鈞
## 5021   3.99              陳少傑
## 5022   3.90              劉宗德
## 5023   3.53              郭柏齡
## 5024   0.71                    
## 5025   3.83              張瑞峰
## 5026   4.00              吳家麟
## 5027   4.23              傅立成
## 5028   4.30              陳健輝
## 5029   4.14                項潔
## 5030   3.79              賴飛羆
## 5031   4.19              陳信希
## 5032   4.20              歐陽明
## 5033   3.91            歐陽彥正
## 5034   3.87              許永真
## 5035   4.18              傅楸善
## 5036   4.24              呂育道
## 5037   4.05              李德財
## 5038   4.14              林智仁
## 5039   4.21              郭大維
## 5040   3.99              劉邦鋒
## 5041   4.19                林風
## 5042   3.98              楊佳玲
## 5043   4.15              洪一平
## 5044   4.21              趙坤茂
## 5045   4.03              周承復
## 5046   4.25              逄愛君
## 5047   4.00              施吉昇
## 5048   4.24              莊永裕
## 5049   3.82              洪士灝
## 5050   3.70              呂學一
## 5051   4.06              薛智文
## 5052   4.07              張瑞峰
## 5053   4.30              曾宇鳳
## 5054   4.08              鄭卜壬
## 5055   4.01              林守德
## 5056   3.85              李明穗
## 5057   4.30              徐宏民
## 5058   4.00              廖世偉
## 5059   4.14              陳炳宇
## 5060   4.12              林軒田
## 5061   4.30              蔡欣穆
## 5062   3.85              陳彥仰
## 5063   4.30              李允中
## 5064   4.00              張智星
## 5065   4.30              徐慰中
## 5066   3.00                    
## 5067   4.21              李琳山
## 5068   4.10              吳家麟
## 5069   4.15              傅立成
## 5070   4.16              陳文進
## 5071   4.27              陳健輝
## 5072   4.07                項潔
## 5073   3.71              賴飛羆
## 5074   4.10              陳信希
## 5075   4.17              歐陽明
## 5076   3.88            歐陽彥正
## 5077   3.94              許永真
## 5078   4.20              傅楸善
## 5079   4.13              呂育道
## 5080   3.67              李德財
## 5081   4.16              林智仁
## 5082   4.29              郭大維
## 5083   4.04              劉邦鋒
## 5084   4.26                林風
## 5085   4.12              楊佳玲
## 5086   4.15              洪一平
## 5087   3.92              趙坤茂
## 5088   4.09              周承復
## 5089   4.23              逄愛君
## 5090   3.82              施吉昇
## 5091   4.25              莊永裕
## 5092   3.90              洪士灝
## 5093   3.46              呂學一
## 5094   4.05              薛智文
## 5095   4.05              張瑞峰
## 5096   4.30              曾宇鳳
## 5097   4.25              鄭卜壬
## 5098   4.15              林守德
## 5099   4.16              李明穗
## 5100   4.22              徐宏民
## 5101   4.12              廖世偉
## 5102   4.11              陳炳宇
## 5103   4.12              林軒田
## 5104   4.08              蔡欣穆
## 5105   4.09              陳彥仰
## 5106   4.30              李允中
## 5107   4.00              張智星
## 5108   4.01              徐慰中
## 5109   4.30              蕭旭君
## 5110   3.95              徐宏民
## 5111   3.72              李明穗
## 5112   3.76              施吉昇
## 5113   3.99              劉長遠
## 5114   3.81              周承復
## 5115   3.71              呂育道
## 5116   3.39              林智仁
## 5117   3.59              陳信希
## 5118   3.92              李允中
## 5119   3.52              吳家麟
## 5120   4.02              徐慰中
## 5121   3.72              逄愛君
## 5122   3.57              楊佳玲
## 5123   3.31              劉邦鋒
## 5124   3.21              張瑞峰
## 5125   3.91              歐陽明
## 5126   3.68              洪一平
## 5127   3.56              賴飛羆
## 5128   3.86              莊永裕
## 5129   3.89                林風
## 5130   4.03              陳彥仰
## 5131   3.60              鄭卜壬
## 5132   3.81              林守德
## 5133   3.68              李琳山
## 5134   3.86              薛智文
## 5135   3.93              陳彥仰
## 5136   3.81              逄愛君
## 5137   3.60              陳維超
## 5138   3.84              傅楸善
## 5139   3.64              曾宇鳳
## 5140   3.50              林智仁
## 5141   3.74              洪士灝
## 5142   3.83              卓政宏
## 5143   3.86              廖世偉
## 5144   3.97              徐慰中
## 5145   1.11                    
## 5146   3.53              林清富
## 5147   2.95                    
## 5148   3.77              林清富
## 5149   3.73              林清富
## 5150   3.55              吳育任
## 5151   3.78              林恭如
## 5152   4.03              彭隆瀚
## 5153   3.61              毛明華
## 5154   3.96              吳忠幟
## 5155   3.67              蔡睿哲
## 5156   4.22                王倫
## 5157   3.57              林清富
## 5158   4.02              李君浩
## 5159   3.54              吳志毅
## 5160   3.89              蔡永傑
## 5161   4.00              黃定洧
## 5162   3.45              江衍偉
## 5163   1.98                    
## 5164   3.84              周錫增
## 5165   3.39              王奕翔
## 5166   3.42                    
## 5167   3.86              周錫增
## 5168   3.49              王奕翔
## 5169   3.67              林坤佑
## 5170   4.04              江簡富
## 5171   3.66              黃天偉
## 5172   3.22              鐘嘉德
## 5173   3.82              吳瑞北
## 5174   3.82              謝宏昀
## 5175   1.82                    
## 5176   2.57                    
## 5177   3.59              李泰成
## 5178   3.65              黃俊郎
## 5179   3.85              管傑雄
## 5180   3.48              黃鐘揚
## 5181   3.62              盧信嘉
## 5182   3.76              張耀文
## 5183   3.56              林宗賢
## 5184   3.96              簡韶逸
## 5185   3.86              呂學士
## 5186   4.15              管傑雄
## 5187   4.00              林木鍊
## 5188   1.04                    
## 5189   4.19              吳家麟
## 5190   4.19              歐陽明
## 5191   4.18              洪一平
## 5192   4.09              逄愛君
## 5193   2.57              施吉昇
## 5194   4.30              陳信希
## 5195   4.20                項潔
## 5196   4.30              郭大維
## 5197   4.02              許永真
## 5198   4.24              林智仁
## 5199   4.27                林風
## 5200   3.93              楊佳玲
## 5201   4.12              周承復
## 5202   4.30              李琳山
## 5203   4.21              莊永裕
## 5204   4.00              洪士灝
## 5205   4.30              陳炳宇
## 5206   4.24              薛智文
## 5207   4.00              張瑞峰
## 5208   4.22              鄭卜壬
## 5209   4.18              林守德
## 5210   3.81              李明穗
## 5211   4.12              徐宏民
## 5212   4.20              廖世偉
## 5213   4.10              傅立成
## 5214   3.70              賴飛羆
## 5215   4.00              陳彥仰
## 5216   4.00              張智星
## 5217   3.68              徐宏民
## 5218   3.19                    
## 5219   4.17              吳家麟
## 5220   4.21              歐陽明
## 5221   4.19              洪一平
## 5222   4.27              逄愛君
## 5223   4.08              施吉昇
## 5224   4.12              陳信希
## 5225   4.10              陳文進
## 5226   4.08                項潔
## 5227   4.27              傅楸善
## 5228   4.30              郭大維
## 5229   4.22              趙坤茂
## 5230   3.74              許永真
## 5231   4.00              林智仁
## 5232   4.30                林風
## 5233   4.15              楊佳玲
## 5234   4.20              周承復
## 5235   4.30              李琳山
## 5236   4.27              莊永裕
## 5237   3.50              呂學一
## 5238   3.99              洪士灝
## 5239   3.79              陳炳宇
## 5240   3.86              薛智文
## 5241   4.15              陳健輝
## 5242   4.17              劉邦鋒
## 5243   4.03              張瑞峰
## 5244   4.27              鄭卜壬
## 5245   4.19              林守德
## 5246   4.20              李明穗
## 5247   4.18              徐宏民
## 5248   4.13              廖世偉
## 5249   4.10              林軒田
## 5250   4.16              呂育道
## 5251   4.13              傅立成
## 5252   3.80              賴飛羆
## 5253   4.12              陳彥仰
## 5254   4.25              蔡欣穆
## 5255   4.30              李允中
## 5256   4.05              張智星
## 5257   3.98              李明穗
## 5258   3.87              許素朱
## 5259   3.50              張智星
## 5260   1.18                    
## 5261   4.05              阮雪芬
## 5262   4.19              孫啟光
## 5263   2.63                    
## 5264   4.06              阮雪芬
## 5265   4.17              孫啟光
## 5266   3.98              宋孔彬
## 5267   3.71              黃念祖
## 5268   2.88              吳琮璠
## 5269   3.05              莊世同
## 5270   3.72              王皇玉
## 5271   3.33              薛智仁
## 5272   3.12              李茂生
## 5273   3.42              周漾沂
## 5274   2.77              吳英傑
## 5275   2.94              陳自強
## 5276   3.26              王能君
## 5277   3.35              邵慶平
## 5278   2.79              黃昭元
## 5279   3.70              姜皇池
## 5280   3.66              林明昕
## 5281   3.79              李素華
## 5282   3.20              謝銘洋
## 5283   3.44              葛克昌
## 5284   3.22              郭振恭
## 5285   3.57              王皇玉
## 5286   3.53              李建良
## 5287   3.13              林明昕
## 5288   2.95              謝煜偉
## 5289   3.13              沈冠伶
## 5290   3.31              陳瑋佑
## 5291   3.29              劉宗榮
## 5292   3.16              汪信君
## 5293   3.31              蔡英欣
## 5294   3.46              葉俊榮
## 5295   3.80              林仁光
## 5296   3.41              黃茂榮
## 5297   3.82              黃詩淳
## 5298   3.98              蔡英欣
## 5299   3.88              王能君
## 5300   3.87              黃銘傑
## 5301   3.72              蔡茂寅
## 5302   3.81              柯格鐘
## 5303   3.96              周漾沂
## 5304   3.85              柯格鐘
## 5305   3.85              周漾沂
## 5306   3.91              柯格鐘
## 5307   4.11              周漾沂
## 5308   3.80              柯格鐘
## 5309   3.79              周漾沂
## 5310   3.98              吳宗謀
## 5311   4.04              吳宗謀
## 5312   4.20              吳宗謀
## 5313   4.15              吳宗謀
## 5314   4.04              吳英傑
## 5315   4.04              吳英傑
## 5316   3.89              余雪明
## 5317   3.69              林明鏘
## 5318   3.74              蔡茂寅
## 5319   3.89              王皇玉
## 5320   3.72              林明鏘
## 5321   3.73              陳瑋佑
## 5322   3.66              林明鏘
## 5323   4.00              陳瑋佑
## 5324   3.80              張文貞
## 5325   3.67              莊世同
## 5326   0.26                    
## 5327   1.31                    
## 5328   4.02              林明鏘
## 5329   3.94              顏厥安
## 5330   4.02              許志雄
## 5331   4.08              許志雄
## 5332   4.01              王皇玉
## 5333   3.93              王皇玉
## 5334   4.16              謝煜偉
## 5335   3.71              林鈺雄
## 5336   3.89              林鈺雄
## 5337   3.86              林鈺雄
## 5338   3.58              林鈺雄
## 5339   3.89              李建良
## 5340   3.94              蔡明誠
## 5341   4.12              王能君
## 5342   4.28              王能君
## 5343   4.30              王能君
## 5344   4.30              王能君
## 5345   3.88              王仁宏
## 5346   3.83              王仁宏
## 5347   4.16              蔡茂寅
## 5348   4.00              廖義男
## 5349   4.00              廖義男
## 5350   4.15              廖義男
## 5351   4.00              廖義男
## 5352   3.53              羅昌發
## 5353   3.93              羅昌發
## 5354   4.00              羅昌發
## 5355   4.18              黃茂榮
## 5356   4.22              黃茂榮
## 5357   4.16              黃茂榮
## 5358   4.30              黃茂榮
## 5359   3.92              姜皇池
## 5360   4.21              姜皇池
## 5361   4.15              姜皇池
## 5362   4.30              姜皇池
## 5363   4.05              汪信君
## 5364   4.00              汪信君
## 5365   3.49              陳聰富
## 5366   3.70              陳聰富
## 5367   3.85              陳聰富
## 5368   4.00              謝銘洋
## 5369   4.08              謝銘洋
## 5370   4.10              謝銘洋
## 5371   4.12              謝銘洋
## 5372   4.04              林明鏘
## 5373   4.15              林明鏘
## 5374   4.00              林明鏘
## 5375   4.00              林明鏘
## 5376   3.94              黃銘傑
## 5377   3.67              黃銘傑
## 5378   4.12              黃銘傑
## 5379   4.30              黃銘傑
## 5380   3.95              林仁光
## 5381   4.04              林仁光
## 5382   4.24              林仁光
## 5383   4.20              林仁光
## 5384   4.11              邵慶平
## 5385   4.03              張文貞
## 5386   4.03              張文貞
## 5387   3.31              顏厥安
## 5388   3.98              汪信君
## 5389   4.06              汪信君
## 5390   4.03              陳自強
## 5391   4.04              林明昕
## 5392   4.10              林明昕
## 5393   3.70              林仁光
## 5394   3.92              余雪明
## 5395   3.91              蔡英欣
## 5396   3.64              簡資修
## 5397   3.42              簡資修
## 5398   3.99              林子儀
## 5399   3.99              黃源浩
## 5400   3.72              李震海
## 5401   4.06              吳志正
## 5402   3.46          查理斯華頓
## 5403   3.23          查理斯華頓
## 5404   4.01              黃居正
## 5405   0.91                    
## 5406   3.62              陳瑋佑
## 5407   3.65              詹森林
## 5408   3.98              吳從周
## 5409   3.78              王皇玉
## 5410   3.72              林明鏘
## 5411   4.16              葉芳萍
## 5412   2.90              陳示國
## 5413   3.38              江皓森
## 5414   3.29              陳瑞芬
## 5415   3.29              李鳳鳴
## 5416   2.97              陳香君
## 5417   3.25              郭典翰
## 5418   3.05              鄭石通
## 5419   2.88              李鳳鳴
## 5420   3.02              于宏燦
## 5421   3.33              李鳳鳴
## 5422   3.18              李鳳鳴
## 5423   3.32              吳高逸
## 5424   3.39              吳高逸
## 5425   3.52              李鳳鳴
## 5426   3.43              李鳳鳴
## 5427   3.42              李鳳鳴
## 5428   3.42              李鳳鳴
## 5429   3.32              李鳳鳴
## 5430   3.65              李士傑
## 5431   3.38              李士傑
## 5432   3.23              李鳳鳴
## 5433   3.18              李鳳鳴
## 5434   3.56              李鳳鳴
## 5435   3.60              李鳳鳴
## 5436   3.59              李鳳鳴
## 5437   3.25              吳高逸
## 5438   3.09              吳高逸
## 5439   3.32              陳香君
## 5440   3.20              陳香君
## 5441   3.36              李玲玲
## 5442   2.92              何國傑
## 5443   3.76              李心予
## 5444   3.90              周蓮香
## 5445   2.46              王道還
## 5446   3.03              陳俊宏
## 5447   3.36              黃偉邦
## 5448   2.70              陳俊宏
## 5449   3.89              陳俊宏
## 5450   3.29              葉開溫
## 5451   3.86              周子賓
## 5452   3.79              周子賓
## 5453   2.71              葉開溫
## 5454   3.52              葉開溫
## 5455   3.56              葉開溫
## 5456   3.79              閔明源
## 5457   3.32              李培芬
## 5458   3.71              李培芬
## 5459   3.29              蕭仁傑
## 5460   3.89              鄭貽生
## 5461   3.80              陳瑞芬
## 5462   3.84              郭典翰
## 5463   3.57              李士傑
## 5464   4.30              鄭貽生
## 5465   4.30              陳香君
## 5466   4.30              陳示國
## 5467   4.00              蔡素宜
## 5468   4.00              林盈仲
## 5469   4.00              王致恬
## 5470   4.30              澤大衛
## 5471   4.00              陳俊宏
## 5472   4.00              李心予
## 5473   3.10              李鳳鳴
## 5474   4.30              黃偉邦
## 5475   4.04              閔明源
## 5476   3.90              阮雪芬
## 5477   3.94              王俊能
## 5478   4.09              丁照棣
## 5479   4.17              鄭貽生
## 5480   2.98              陳香君
## 5481   4.10              郭典翰
## 5482   4.13              吳高逸
## 5483   4.00              王雅筠
## 5484   4.00              丘臺生
## 5485   4.30              嚴震東
## 5486   4.00              潘建源
## 5487   4.00              朱家瑩
## 5488   4.18              陳示國
## 5489   4.15              江皓森
## 5490   4.00              周信宏
## 5491   4.04              蔡素宜
## 5492   4.18              林盈仲
## 5493   4.00              葉開溫
## 5494   4.00              鄭石通
## 5495   3.99              靳宗洛
## 5496   3.67              鄭秋萍
## 5497   4.00              吳克強
## 5498   4.00        張英<U+5CEF>
## 5499   4.00              董桂書
## 5500   4.04              王致恬
## 5501   4.30              溫進德
## 5502   4.15              黃筱鈞
## 5503   3.90              李玲玲
## 5504   4.00              胡哲明
## 5505   3.70              高文媛
## 5506   4.24              澤大衛
## 5507   4.30              周宏農
## 5508   3.70              廖文亮
## 5509   3.70              李英周
## 5510   3.74              廖憶純
## 5511   3.75              廖憶純
## 5512   3.12              梁國淦
## 5513   3.00              黃慶璨
## 5514   3.87              張麗冠
## 5515   3.89              張麗冠
## 5516   3.96        楊<U+5553>伸
## 5517   4.04              林甫容
## 5518   4.12              陳彥榮
## 5519   2.49              李平篤
## 5520   4.15              李昆達
## 5521   4.12              陳俊任
## 5522   4.15              楊健志
## 5523   4.06              張世宗
## 5524   3.94              黃楓婷
## 5525   3.87              黃青真
## 5526   4.07              林璧鳳
## 5527   4.15              林甫容
## 5528   3.94              黃慶璨
## 5529   3.54        楊<U+5553>伸
## 5530   4.13              張麗冠
## 5531   4.21              林晉玄
## 5532   3.85              陳彥榮
## 5533   4.22              廖憶純
## 5534   4.30              梁國淦
## 5535   0.58                    
## 5536   2.48                    
## 5537   4.00              閔明源
## 5538   4.00              于宏燦
## 5539   4.00              嚴震東
## 5540   3.88              江皓森
## 5541   4.05              李心予
## 5542   3.84              李士傑
## 5543   4.05              潘建源
## 5544   3.90              黃偉邦
## 5545   4.15              陳瑞芬
## 5546   4.09              閔明源
## 5547   4.19              朱家瑩
## 5548   4.13              施秀惠
## 5549   4.11              陳示國
## 5550   3.33              郭典翰
## 5551   4.00              潘建源
## 5552   3.82              陳瑞芬
## 5553   4.01              李鳳鳴
## 5554   4.30              嚴震東
## 5555   3.36              丘臺生
## 5556   3.00              沈世傑
## 5557   3.82              楊文欽
## 5558   3.48              阮雪芬
## 5559   1.02                    
## 5560   4.03              陳彥榮
## 5561   3.97              廖憶純
## 5562   4.26              黃青真
## 5563   3.99              張麗冠
## 5564   4.12              潘子明
## 5565   4.20              李昆達
## 5566   4.30              何佳安
## 5567   4.30              張世宗
## 5568   4.30              林璧鳳
## 5569   4.00              黃慶璨
## 5570   4.00              張麗冠
## 5571   4.30              陳進庭
## 5572   4.15              陳彥榮
## 5573   4.30              廖憶純
## 5574   4.10              潘子明
## 5575   4.10              李昆達
## 5576   4.30              何佳安
## 5577   4.00              張世宗
## 5578   4.30              黃青真
## 5579   4.30              林璧鳳
## 5580   4.30              黃慶璨
## 5581   4.00              張麗冠
## 5582   4.10              陳進庭
## 5583   4.00              林晉玄
## 5584   4.30              陳彥榮
## 5585   4.00              廖憶純
## 5586   3.60              廖憶純
## 5587   4.02              王愛玉
## 5588   3.88              王愛玉
## 5589   3.09                    
## 5590   3.99              陳彥榮
## 5591   3.81              廖憶純
## 5592   3.91              林甫容
## 5593   4.03              張麗冠
## 5594   3.94              王愛玉
## 5595   3.35              李平篤
## 5596   3.71        楊<U+5553>伸
## 5597   4.07              潘子明
## 5598   4.15              李昆達
## 5599   4.23              陳俊任
## 5600   3.90              何佳安
## 5601   4.10              王愛玉
## 5602   4.14              楊健志
## 5603   4.12              張世宗
## 5604   4.13              黃楓婷
## 5605   4.05              黃青真
## 5606   3.86              蕭寧馨
## 5607   4.09              林璧鳳
## 5608   3.91              黃慶璨
## 5609   4.14        楊<U+5553>伸
## 5610   4.06              張麗冠
## 5611   4.13              陳進庭
## 5612   4.00              林晉玄
## 5613   4.27              莊榮輝
## 5614   4.21              陳彥榮
## 5615   4.00              廖憶純
## 5616   4.00              徐麗芬
## 5617   4.20              常怡雍
## 5618   4.30              蘇南維
## 5619   4.00              黃楓婷
## 5620   4.07              林甫容
## 5621   3.22              陳進庭
## 5622   3.78              徐麗芬
## 5623   3.75              何佳安
## 5624   4.14              陳彥榮
## 5625   4.16              陳進庭
## 5626   0.69                    
## 5627   3.87              葉開溫
## 5628   4.02              鄭石通
## 5629   3.98              靳宗洛
## 5630   4.12              謝旭亮
## 5631   4.00              鄭貽生
## 5632   3.95              吳克強
## 5633   3.94              金洛仁
## 5634   3.96        張英<U+5CEF>
## 5635   3.97              施明哲
## 5636   3.86              謝旭亮
## 5637   2.13                    
## 5638   4.01              葉開溫
## 5639   4.03              鄭石通
## 5640   3.79              靳宗洛
## 5641   4.16              謝旭亮
## 5642   3.67              林盈仲
## 5643   4.02              鄭貽生
## 5644   3.58              鄭秋萍
## 5645   3.69              吳克強
## 5646   4.15              金洛仁
## 5647   4.01        張英<U+5CEF>
## 5648   3.96              施明哲
## 5649   4.20              王雅筠
## 5650   3.57              靳宗洛
## 5651   3.52              葉開溫
## 5652   3.83              鄭石通
## 5653   3.61              葉開溫
## 5654   3.68              謝旭亮
## 5655   3.61              鄭石通
## 5656   3.66              靳宗洛
## 5657   3.69              吳克強
## 5658   3.60              靳宗洛
## 5659   3.50        張英<U+5CEF>
## 5660   3.51              鄭秋萍
## 5661   0.85                    
## 5662   3.93              溫進德
## 5663   3.92              蔡懷楨
## 5664   4.06              柯逢春
## 5665   4.00              吳益群
## 5666   4.30              王致恬
## 5667   3.63              溫進德
## 5668   2.36                    
## 5669   3.89              董桂書
## 5670   3.71              蔡懷楨
## 5671   3.70              柯逢春
## 5672   3.60              周子賓
## 5673   3.97              吳益群
## 5674   3.98              董桂書
## 5675   4.07              蔡宜芳
## 5676   3.93              李秀敏
## 5677   4.22              王致恬
## 5678   4.11              溫進德
## 5679   4.15              莊志立
## 5680   4.30              江運金
## 5681   4.10              王紹文
## 5682   3.99              吳益群
## 5683   3.67              周子賓
## 5684   3.94              董桂書
## 5685   4.07              阮雪芬
## 5686   4.30              黃筱鈞
## 5687   3.95              吳益群
## 5688   3.64              蔡懷楨
## 5689   3.93              黃火鍊
## 5690   3.30              周子賓
## 5691   3.58              柯逢春
## 5692   4.02              王致恬
## 5693   4.03              蔡宜芳
## 5694   4.15              李秀敏
## 5695   3.96              溫進德
## 5696   0.46                    
## 5697   3.82              何傳愷
## 5698   3.98              周蓮香
## 5699   4.15              李玲玲
## 5700   4.16              李培芬
## 5701   4.10              胡哲明
## 5702   4.00              陳淑華
## 5703   3.89              高文媛
## 5704   4.22              黃玲瓏
## 5705   4.17              王俊能
## 5706   4.23              朱宇敏
## 5707   4.30              邱少婷
## 5708   3.98              丁照棣
## 5709   4.18              陳國勤
## 5710   4.06              謝志豪
## 5711   2.02                    
## 5712   3.85              何傳愷
## 5713   3.98              周蓮香
## 5714   4.23              李玲玲
## 5715   4.12              李培芬
## 5716   3.94              胡哲明
## 5717   3.80              高文媛
## 5718   4.15              黃玲瓏
## 5719   4.14              王俊能
## 5720   4.00              朱宇敏
## 5721   3.91              丁照棣
## 5722   4.15              陳國勤
## 5723   4.08              謝志豪
## 5724   4.00              陳香君
## 5725   4.18              何傳愷
## 5726   4.10              沈聖峰
## 5727   4.20              李培芬
## 5728   3.35              郭城孟
## 5729   3.41              黃玲瓏
## 5730   2.97              朱宇敏
## 5731   3.70              陳香君
## 5732   3.68              陳國勤
## 5733   3.64              李玲玲
## 5734   4.07              何傳愷
## 5735   0.49                    
## 5736   3.63              廖文亮
## 5737   2.10                    
## 5738   3.90              周宏農
## 5739   4.05              韓玉山
## 5740   3.61              周宏農
## 5741   3.74              李英周
## 5742   3.75              廖文亮
## 5743   3.65              周宏農
## 5744   3.92              王永松
## 5745   3.71              陳秀男
## 5746   3.77              李宗徽
## 5747   3.44              李英周
## 5748   3.63              廖文亮
## 5749   3.82              呂仲倫
## 5750   2.42              蕭超隆
## 5751   2.60              余榮熾
## 5752   1.08                    
## 5753   4.13              張震東
## 5754   3.99              余榮熾
## 5755   3.99              果伽蘭
## 5756   3.85              張茂山
## 5757   4.02              管永恕
## 5758   4.10              冀宏源
## 5759   4.06              蔡明道
## 5760   4.08              郭明良
## 5761   4.09              翁啟惠
## 5762   4.16              徐尚德
## 5763   4.12              蕭超隆
## 5764   4.10              王惠鈞
## 5765   4.11              邱繼輝
## 5766   4.21              陳佩燁
## 5767   3.83              蕭超隆
## 5768   3.97              張茂山
## 5769   3.83              張震東
## 5770   4.01              果伽蘭
## 5771   3.88              蕭超隆
## 5772   4.11              管永恕
## 5773   3.89              冀宏源
## 5774   4.09              楊維元
## 5775   3.97              史有伶
## 5776   4.09              郭明良
## 5777   3.59              孟子青
## 5778   3.09              陳佩燁
## 5779   3.35              梁博煌
## 5780   3.78              蔡明道
## 5781   3.20              王彥士
## 5782   4.00              陳佩燁
## 5783   3.25                    
## 5784   4.15              張震東
## 5785   3.81              余榮熾
## 5786   4.08              果伽蘭
## 5787   4.01              張茂山
## 5788   4.02              管永恕
## 5789   4.14              冀宏源
## 5790   3.96              蔡明道
## 5791   4.02              郭明良
## 5792   4.11              翁啟惠
## 5793   4.05              徐尚德
## 5794   3.89              蕭超隆
## 5795   4.14              王惠鈞
## 5796   3.92              邱繼輝
## 5797   4.26              陳佩燁
## 5798   3.94              蕭超隆
## 5799   3.88              張茂山
## 5800   3.85              張震東
## 5801   3.96              果伽蘭
## 5802   3.95              蕭超隆
## 5803   4.09              管永恕
## 5804   3.80              冀宏源
## 5805   3.84              楊維元
## 5806   3.97              黃銓珍
## 5807   3.73              陳義雄
## 5808   4.15              陳光超
## 5809   3.62              邱繼輝
## 5810   0.23                    
## 5811   4.17              陳佑宗
## 5812   3.89              陳佑宗
## 5813   4.30              姚孟肇
## 5814   4.15              吳益群
## 5815   4.24              曾宇鳳
## 5816   4.06              楊泮池
## 5817   4.24              張典顯
## 5818   4.05              林劭品
## 5819   3.75              蔡孟勳
## 5820   4.08              楊偉勛
## 5821   3.60              莊曜宇
## 5822   3.72              呂  仁
## 5823   4.30              陳光超
## 5824   2.70              李克昭
## 5825   4.08              溫進德
## 5826   4.00              徐駿森
## 5827   4.00              陳玉如
## 5828   4.10              蔡懷寬
## 5829   4.00              陳璿宇
## 5830   4.20              莊樹諄
## 5831   4.00              呂俊毅
## 5832   4.30              陳倩瑜
## 5833   4.15              周玉山
## 5834   3.57              沈志陽
## 5835   4.30              呂俊毅
## 5836   4.15              鄭淑珍
## 5837   4.30              顏雪琪
## 5838   4.30              于宏燦
## 5839   4.00              王致恬
## 5840   4.30              施純傑
## 5841   3.89              潘思樺
## 5842   2.00                    
## 5843   4.00              張俊哲
## 5844   4.00              阮雪芬
## 5845   4.13              高承福
## 5846   4.30              楊安綏
## 5847   4.15              陳惠文
## 5848   4.20              蔡怡陞
## 5849   3.85              許聞廉
## 5850   4.30              蔡孟勳
## 5851   3.97              蔡怡陞
## 5852   4.04              丁照棣
## 5853   3.55              傅皓政
## 5854   3.74              洪萬生
## 5855   3.72              曾宗盛
## 5856   3.81              洪英正
## 5857   3.50        郭任<U+5CEF>
## 5858   3.76              黃雅嫺
## 5859   3.93              黃仲菁
## 5860   1.33                    
## 5861   3.67              陳伊琳
## 5862   3.58              徐式寬
## 5863   3.80              王秀槐
## 5864   3.50              符碧真
## 5865   3.77              洪承宇
## 5866   3.84              陳伊琳
## 5867   3.72              符碧真
## 5868   3.75              徐式寬
## 5869   3.88              侯潔之
## 5870   3.90              廖彥棻
## 5871   3.88              張海潮
## 5872   3.61              吳秀玲
## 5873   3.77              李建堂
## 5874   3.74              符碧真
## 5875   3.81              王秀槐
## 5876   3.89              陳伊琳
## 5877   3.80              王秀槐
## 5878   3.66              符碧真
## 5879   4.00              陳明姿
## 5880   4.12              陳育霖
## 5881   3.96              佘瑞琳
## 5882   3.84              吳育雅
## 5883   3.92              董桂書
## 5884   4.01              柯景棋
## 5885   3.89              賴進貴
## 5886   3.87            歐陽宜璋
## 5887   4.03              黃馨瑩
## 5888   4.19              張海潮
## 5889   3.80              葉仲基
## 5890   4.12              葉仲基
## 5891   3.86              葉仲基
## 5892   4.22              黃文達
## 5893   3.90              吳秀玲
## 5894   3.78              林慈淑
## 5895   3.83              黃長玲
## 5896   2.20              靳宗洛
## 5897   3.52              杜宜殷
## 5898   3.55              林乃君
## 5899   3.33              張文章
## 5900   3.80              沈湯龍
## 5901   3.30              蕭培文
## 5902   4.10                    
## 5903   4.30                    
## 5904   3.99              吳信志
## 5905   4.04              林艷君
## 5906   3.58              瞿志豪
## 5907   3.82              許朱勝
## 5908   3.87              鄧怡莘
## 5909   4.10              謝宏達
## 5910   3.78              林晉玄
## 5911   3.84              李維晏
## 5912   3.88              熊宜君
## 5913   3.99              陳巧玲
## 5914   3.99              劉美德
## 5915   3.76              安馬克
## 5916   3.79              陳巧玲
## 5917   3.72              江介維
## 5918   3.70              熊宜君
## 5919   3.78                張晨
## 5920   3.94                張晨
## 5921   4.00              蔡柏盈
## 5922   3.88              蔡柏盈
##                                                            href
## 1    http://ntusweety.herokuapp.com/history?&id=002+50440&cl=22
## 2    http://ntusweety.herokuapp.com/history?&id=002+50570&cl=16
## 3    http://ntusweety.herokuapp.com/history?&id=002+50630&cl=D5
## 4    http://ntusweety.herokuapp.com/history?&id=002+50630&cl=D6
## 5    http://ntusweety.herokuapp.com/history?&id=002+50630&cl=F8
## 6    http://ntusweety.herokuapp.com/history?&id=002+50730&cl=32
## 7    http://ntusweety.herokuapp.com/history?&id=002+50780&cl=02
## 8    http://ntusweety.herokuapp.com/history?&id=002+50780&cl=03
## 9    http://ntusweety.herokuapp.com/history?&id=002+50780&cl=04
## 10   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=05
## 11   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=07
## 12   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=08
## 13   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=09
## 14   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=10
## 15   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=13
## 16   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=14
## 17   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=15
## 18   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=89
## 19   http://ntusweety.herokuapp.com/history?&id=002+50780&cl=B2
## 20   http://ntusweety.herokuapp.com/history?&id=002+50790&cl=90
## 21   http://ntusweety.herokuapp.com/history?&id=002+50900&cl=A1
## 22   http://ntusweety.herokuapp.com/history?&id=002+50900&cl=A2
## 23   http://ntusweety.herokuapp.com/history?&id=002+50900&cl=A8
## 24   http://ntusweety.herokuapp.com/history?&id=002+50900&cl=G5
## 25   http://ntusweety.herokuapp.com/history?&id=002+50900&cl=G6
## 26   http://ntusweety.herokuapp.com/history?&id=002+50960&cl=60
## 27   http://ntusweety.herokuapp.com/history?&id=002+51020&cl=K2
## 28   http://ntusweety.herokuapp.com/history?&id=002+51060&cl=28
## 29   http://ntusweety.herokuapp.com/history?&id=002+51060&cl=29
## 30   http://ntusweety.herokuapp.com/history?&id=002+51060&cl=30
## 31   http://ntusweety.herokuapp.com/history?&id=002+51260&cl=52
## 32   http://ntusweety.herokuapp.com/history?&id=002+51260&cl=53
## 33   http://ntusweety.herokuapp.com/history?&id=002+51260&cl=H1
## 34   http://ntusweety.herokuapp.com/history?&id=002+51260&cl=H2
## 35   http://ntusweety.herokuapp.com/history?&id=002+51270&cl=54
## 36   http://ntusweety.herokuapp.com/history?&id=002+70520&cl=17
## 37   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=01
## 38   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=02
## 39   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=03
## 40   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=04
## 41   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=05
## 42   http://ntusweety.herokuapp.com/history?&id=004+20120&cl=06
## 43   http://ntusweety.herokuapp.com/history?&id=004+20320&cl=01
## 44   http://ntusweety.herokuapp.com/history?&id=004+20320&cl=02
## 45     http://ntusweety.herokuapp.com/history?&id=101+11500&cl=
## 46   http://ntusweety.herokuapp.com/history?&id=101+14102&cl=01
## 47   http://ntusweety.herokuapp.com/history?&id=101+14102&cl=02
## 48     http://ntusweety.herokuapp.com/history?&id=101+14202&cl=
## 49     http://ntusweety.herokuapp.com/history?&id=101+15812&cl=
## 50     http://ntusweety.herokuapp.com/history?&id=101+15822&cl=
## 51     http://ntusweety.herokuapp.com/history?&id=101+161B2&cl=
## 52     http://ntusweety.herokuapp.com/history?&id=101+163A2&cl=
## 53   http://ntusweety.herokuapp.com/history?&id=101+18102&cl=01
## 54   http://ntusweety.herokuapp.com/history?&id=101+18102&cl=02
## 55     http://ntusweety.herokuapp.com/history?&id=101+19802&cl=
## 56   http://ntusweety.herokuapp.com/history?&id=101+211B2&cl=01
## 57   http://ntusweety.herokuapp.com/history?&id=101+211B2&cl=02
## 58   http://ntusweety.herokuapp.com/history?&id=101+212A2&cl=01
## 59   http://ntusweety.herokuapp.com/history?&id=101+212A2&cl=02
## 60     http://ntusweety.herokuapp.com/history?&id=101+220A2&cl=
## 61     http://ntusweety.herokuapp.com/history?&id=101+222B2&cl=
## 62     http://ntusweety.herokuapp.com/history?&id=101+22702&cl=
## 63     http://ntusweety.herokuapp.com/history?&id=101+22802&cl=
## 64     http://ntusweety.herokuapp.com/history?&id=101+24920&cl=
## 65   http://ntusweety.herokuapp.com/history?&id=101+25102&cl=01
## 66   http://ntusweety.herokuapp.com/history?&id=101+25102&cl=02
## 67     http://ntusweety.herokuapp.com/history?&id=101+25212&cl=
## 68     http://ntusweety.herokuapp.com/history?&id=101+25222&cl=
## 69   http://ntusweety.herokuapp.com/history?&id=101+26002&cl=01
## 70   http://ntusweety.herokuapp.com/history?&id=101+26002&cl=02
## 71   http://ntusweety.herokuapp.com/history?&id=101+271A2&cl=01
## 72   http://ntusweety.herokuapp.com/history?&id=101+271A2&cl=02
## 73     http://ntusweety.herokuapp.com/history?&id=101+28320&cl=
## 74   http://ntusweety.herokuapp.com/history?&id=101+311A2&cl=01
## 75   http://ntusweety.herokuapp.com/history?&id=101+311A2&cl=02
## 76     http://ntusweety.herokuapp.com/history?&id=101+321A2&cl=
## 77     http://ntusweety.herokuapp.com/history?&id=101+322A2&cl=
## 78     http://ntusweety.herokuapp.com/history?&id=101+323A2&cl=
## 79     http://ntusweety.herokuapp.com/history?&id=101+331A2&cl=
## 80     http://ntusweety.herokuapp.com/history?&id=101+332A2&cl=
## 81     http://ntusweety.herokuapp.com/history?&id=101+334A2&cl=
## 82     http://ntusweety.herokuapp.com/history?&id=101+34002&cl=
## 83     http://ntusweety.herokuapp.com/history?&id=101+35800&cl=
## 84     http://ntusweety.herokuapp.com/history?&id=101+36202&cl=
## 85     http://ntusweety.herokuapp.com/history?&id=101+372A2&cl=
## 86     http://ntusweety.herokuapp.com/history?&id=101+373B2&cl=
## 87     http://ntusweety.herokuapp.com/history?&id=101+37402&cl=
## 88   http://ntusweety.herokuapp.com/history?&id=101+41102&cl=01
## 89   http://ntusweety.herokuapp.com/history?&id=101+41102&cl=02
## 90   http://ntusweety.herokuapp.com/history?&id=101+41202&cl=01
## 91   http://ntusweety.herokuapp.com/history?&id=101+41202&cl=02
## 92     http://ntusweety.herokuapp.com/history?&id=101+42300&cl=
## 93     http://ntusweety.herokuapp.com/history?&id=101+42402&cl=
## 94     http://ntusweety.herokuapp.com/history?&id=101+42800&cl=
## 95     http://ntusweety.herokuapp.com/history?&id=101+42900&cl=
## 96     http://ntusweety.herokuapp.com/history?&id=101+45702&cl=
## 97     http://ntusweety.herokuapp.com/history?&id=101+51120&cl=
## 98     http://ntusweety.herokuapp.com/history?&id=101+51200&cl=
## 99     http://ntusweety.herokuapp.com/history?&id=101+51410&cl=
## 100    http://ntusweety.herokuapp.com/history?&id=101+51420&cl=
## 101    http://ntusweety.herokuapp.com/history?&id=101+51510&cl=
## 102    http://ntusweety.herokuapp.com/history?&id=101+51520&cl=
## 103    http://ntusweety.herokuapp.com/history?&id=101+51800&cl=
## 104  http://ntusweety.herokuapp.com/history?&id=102+14120&cl=01
## 105  http://ntusweety.herokuapp.com/history?&id=102+14120&cl=03
## 106  http://ntusweety.herokuapp.com/history?&id=102+14202&cl=01
## 107  http://ntusweety.herokuapp.com/history?&id=102E14202&cl=02
## 108  http://ntusweety.herokuapp.com/history?&id=102+14202&cl=03
## 109    http://ntusweety.herokuapp.com/history?&id=102E20610&cl=
## 110  http://ntusweety.herokuapp.com/history?&id=102+21112&cl=01
## 111  http://ntusweety.herokuapp.com/history?&id=102+21112&cl=02
## 112  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=01
## 113  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=02
## 114  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=03
## 115  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=04
## 116  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=05
## 117  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=06
## 118  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=07
## 119  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=08
## 120  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=09
## 121  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=10
## 122  http://ntusweety.herokuapp.com/history?&id=102+22112&cl=11
## 123  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=01
## 124  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=02
## 125  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=03
## 126  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=04
## 127  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=07
## 128  http://ntusweety.herokuapp.com/history?&id=102+22212&cl=08
## 129  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=01
## 130  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=02
## 131  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=03
## 132  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=04
## 133  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=05
## 134  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=06
## 135  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=07
## 136  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=08
## 137  http://ntusweety.herokuapp.com/history?&id=102+22312&cl=10
## 138  http://ntusweety.herokuapp.com/history?&id=102+22412&cl=01
## 139  http://ntusweety.herokuapp.com/history?&id=102+22412&cl=02
## 140  http://ntusweety.herokuapp.com/history?&id=102+22612&cl=01
## 141    http://ntusweety.herokuapp.com/history?&id=102+22712&cl=
## 142    http://ntusweety.herokuapp.com/history?&id=102+22722&cl=
## 143    http://ntusweety.herokuapp.com/history?&id=102E22812&cl=
## 144  http://ntusweety.herokuapp.com/history?&id=102+22822&cl=01
## 145  http://ntusweety.herokuapp.com/history?&id=102+22822&cl=02
## 146    http://ntusweety.herokuapp.com/history?&id=102+22832&cl=
## 147    http://ntusweety.herokuapp.com/history?&id=102+22842&cl=
## 148    http://ntusweety.herokuapp.com/history?&id=102+22852&cl=
## 149    http://ntusweety.herokuapp.com/history?&id=102+22862&cl=
## 150    http://ntusweety.herokuapp.com/history?&id=102+23140&cl=
## 151    http://ntusweety.herokuapp.com/history?&id=102E23150&cl=
## 152    http://ntusweety.herokuapp.com/history?&id=102+23160&cl=
## 153    http://ntusweety.herokuapp.com/history?&id=102+23170&cl=
## 154    http://ntusweety.herokuapp.com/history?&id=102E23190&cl=
## 155  http://ntusweety.herokuapp.com/history?&id=102+23300&cl=01
## 156  http://ntusweety.herokuapp.com/history?&id=102+23300&cl=02
## 157  http://ntusweety.herokuapp.com/history?&id=102E24120&cl=01
## 158  http://ntusweety.herokuapp.com/history?&id=102+24120&cl=02
## 159  http://ntusweety.herokuapp.com/history?&id=102+24120&cl=03
## 160    http://ntusweety.herokuapp.com/history?&id=102+24230&cl=
## 161    http://ntusweety.herokuapp.com/history?&id=102+24440&cl=
## 162    http://ntusweety.herokuapp.com/history?&id=102+24640&cl=
## 163    http://ntusweety.herokuapp.com/history?&id=102+24700&cl=
## 164    http://ntusweety.herokuapp.com/history?&id=102+30490&cl=
## 165  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=01
## 166  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=02
## 167  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=03
## 168  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=04
## 169  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=06
## 170  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=07
## 171  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=08
## 172  http://ntusweety.herokuapp.com/history?&id=102+31302&cl=09
## 173  http://ntusweety.herokuapp.com/history?&id=102+32122&cl=01
## 174  http://ntusweety.herokuapp.com/history?&id=102+32122&cl=02
## 175  http://ntusweety.herokuapp.com/history?&id=102+32122&cl=03
## 176  http://ntusweety.herokuapp.com/history?&id=102+32122&cl=04
## 177  http://ntusweety.herokuapp.com/history?&id=102+32122&cl=05
## 178  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=01
## 179  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=02
## 180  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=03
## 181  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=04
## 182  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=05
## 183  http://ntusweety.herokuapp.com/history?&id=102+32222&cl=06
## 184  http://ntusweety.herokuapp.com/history?&id=102+32322&cl=01
## 185  http://ntusweety.herokuapp.com/history?&id=102+32322&cl=02
## 186  http://ntusweety.herokuapp.com/history?&id=102+32322&cl=03
## 187  http://ntusweety.herokuapp.com/history?&id=102+32322&cl=06
## 188    http://ntusweety.herokuapp.com/history?&id=102+32422&cl=
## 189    http://ntusweety.herokuapp.com/history?&id=102E32622&cl=
## 190    http://ntusweety.herokuapp.com/history?&id=102E32822&cl=
## 191    http://ntusweety.herokuapp.com/history?&id=102+32832&cl=
## 192    http://ntusweety.herokuapp.com/history?&id=102+32842&cl=
## 193    http://ntusweety.herokuapp.com/history?&id=102+32852&cl=
## 194    http://ntusweety.herokuapp.com/history?&id=102+32872&cl=
## 195    http://ntusweety.herokuapp.com/history?&id=102+35220&cl=
## 196    http://ntusweety.herokuapp.com/history?&id=102E35740&cl=
## 197    http://ntusweety.herokuapp.com/history?&id=102E40330&cl=
## 198    http://ntusweety.herokuapp.com/history?&id=102+42132&cl=
## 199  http://ntusweety.herokuapp.com/history?&id=102+42232&cl=01
## 200  http://ntusweety.herokuapp.com/history?&id=102+42232&cl=02
## 201  http://ntusweety.herokuapp.com/history?&id=102+42232&cl=03
## 202  http://ntusweety.herokuapp.com/history?&id=102+42332&cl=01
## 203  http://ntusweety.herokuapp.com/history?&id=102+42332&cl=02
## 204    http://ntusweety.herokuapp.com/history?&id=102+42360&cl=
## 205    http://ntusweety.herokuapp.com/history?&id=102+42432&cl=
## 206  http://ntusweety.herokuapp.com/history?&id=102+42542&cl=01
## 207  http://ntusweety.herokuapp.com/history?&id=102+42542&cl=02
## 208    http://ntusweety.herokuapp.com/history?&id=102+42552&cl=
## 209    http://ntusweety.herokuapp.com/history?&id=102+43030&cl=
## 210    http://ntusweety.herokuapp.com/history?&id=102+43040&cl=
## 211    http://ntusweety.herokuapp.com/history?&id=102+43050&cl=
## 212    http://ntusweety.herokuapp.com/history?&id=102+43990&cl=
## 213  http://ntusweety.herokuapp.com/history?&id=102+44220&cl=01
## 214  http://ntusweety.herokuapp.com/history?&id=102+44220&cl=02
## 215    http://ntusweety.herokuapp.com/history?&id=102+45700&cl=
## 216    http://ntusweety.herokuapp.com/history?&id=102+46102&cl=
## 217    http://ntusweety.herokuapp.com/history?&id=102+48050&cl=
## 218  http://ntusweety.herokuapp.com/history?&id=102E49112&cl=01
## 219  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=02
## 220  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=03
## 221  http://ntusweety.herokuapp.com/history?&id=102E49112&cl=04
## 222  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=05
## 223  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=06
## 224  http://ntusweety.herokuapp.com/history?&id=102E49112&cl=07
## 225  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=08
## 226  http://ntusweety.herokuapp.com/history?&id=102+49112&cl=09
## 227  http://ntusweety.herokuapp.com/history?&id=102E49112&cl=10
## 228  http://ntusweety.herokuapp.com/history?&id=102E49122&cl=01
## 229  http://ntusweety.herokuapp.com/history?&id=102+49122&cl=02
## 230  http://ntusweety.herokuapp.com/history?&id=102+49122&cl=03
## 231  http://ntusweety.herokuapp.com/history?&id=102E49122&cl=05
## 232  http://ntusweety.herokuapp.com/history?&id=102+49122&cl=06
## 233  http://ntusweety.herokuapp.com/history?&id=102E49122&cl=07
## 234  http://ntusweety.herokuapp.com/history?&id=102E49122&cl=08
## 235  http://ntusweety.herokuapp.com/history?&id=102+49122&cl=09
## 236  http://ntusweety.herokuapp.com/history?&id=102E49122&cl=10
## 237  http://ntusweety.herokuapp.com/history?&id=102+49132&cl=01
## 238  http://ntusweety.herokuapp.com/history?&id=102E49132&cl=02
## 239  http://ntusweety.herokuapp.com/history?&id=102+49132&cl=03
## 240  http://ntusweety.herokuapp.com/history?&id=102E49132&cl=04
## 241    http://ntusweety.herokuapp.com/history?&id=102+50040&cl=
## 242  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=01
## 243  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=02
## 244  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=03
## 245  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=04
## 246  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=05
## 247  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=06
## 248  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=07
## 249  http://ntusweety.herokuapp.com/history?&id=102E50112&cl=08
## 250  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=01
## 251  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=02
## 252  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=03
## 253  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=04
## 254  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=05
## 255  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=06
## 256  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=07
## 257  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=08
## 258  http://ntusweety.herokuapp.com/history?&id=102E50122&cl=09
## 259  http://ntusweety.herokuapp.com/history?&id=102+53620&cl=01
## 260  http://ntusweety.herokuapp.com/history?&id=102+53620&cl=02
## 261    http://ntusweety.herokuapp.com/history?&id=102+53630&cl=
## 262    http://ntusweety.herokuapp.com/history?&id=102+53680&cl=
## 263  http://ntusweety.herokuapp.com/history?&id=102+53700&cl=01
## 264  http://ntusweety.herokuapp.com/history?&id=102+53700&cl=02
## 265  http://ntusweety.herokuapp.com/history?&id=102+53700&cl=03
## 266    http://ntusweety.herokuapp.com/history?&id=102+53780&cl=
## 267    http://ntusweety.herokuapp.com/history?&id=102+53820&cl=
## 268    http://ntusweety.herokuapp.com/history?&id=102+53930&cl=
## 269    http://ntusweety.herokuapp.com/history?&id=102+53970&cl=
## 270  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=02
## 271  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=03
## 272  http://ntusweety.herokuapp.com/history?&id=102+83420&cl=04
## 273  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=05
## 274  http://ntusweety.herokuapp.com/history?&id=102+83420&cl=07
## 275  http://ntusweety.herokuapp.com/history?&id=102+83420&cl=08
## 276  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=10
## 277  http://ntusweety.herokuapp.com/history?&id=102+83420&cl=11
## 278  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=12
## 279  http://ntusweety.herokuapp.com/history?&id=102E83420&cl=16
## 280    http://ntusweety.herokuapp.com/history?&id=103+00500&cl=
## 281  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=01
## 282  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=02
## 283  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=03
## 284  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=04
## 285  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=05
## 286  http://ntusweety.herokuapp.com/history?&id=103+00520&cl=07
## 287    http://ntusweety.herokuapp.com/history?&id=103+10340&cl=
## 288    http://ntusweety.herokuapp.com/history?&id=103+20120&cl=
## 289    http://ntusweety.herokuapp.com/history?&id=103+23170&cl=
## 290    http://ntusweety.herokuapp.com/history?&id=103+34102&cl=
## 291    http://ntusweety.herokuapp.com/history?&id=103+40270&cl=
## 292    http://ntusweety.herokuapp.com/history?&id=103+50010&cl=
## 293    http://ntusweety.herokuapp.com/history?&id=103+50790&cl=
## 294    http://ntusweety.herokuapp.com/history?&id=103+51230&cl=
## 295    http://ntusweety.herokuapp.com/history?&id=103+51400&cl=
## 296    http://ntusweety.herokuapp.com/history?&id=103+51412&cl=
## 297    http://ntusweety.herokuapp.com/history?&id=103+51450&cl=
## 298    http://ntusweety.herokuapp.com/history?&id=103+51620&cl=
## 299    http://ntusweety.herokuapp.com/history?&id=103+51660&cl=
## 300    http://ntusweety.herokuapp.com/history?&id=103+51860&cl=
## 301    http://ntusweety.herokuapp.com/history?&id=103+51890&cl=
## 302    http://ntusweety.herokuapp.com/history?&id=103+52060&cl=
## 303    http://ntusweety.herokuapp.com/history?&id=103+52290&cl=
## 304    http://ntusweety.herokuapp.com/history?&id=103+52350&cl=
## 305    http://ntusweety.herokuapp.com/history?&id=103+52430&cl=
## 306    http://ntusweety.herokuapp.com/history?&id=103+52470&cl=
## 307  http://ntusweety.herokuapp.com/history?&id=103+52560&cl=01
## 308  http://ntusweety.herokuapp.com/history?&id=103+52560&cl=02
## 309    http://ntusweety.herokuapp.com/history?&id=104+08300&cl=
## 310    http://ntusweety.herokuapp.com/history?&id=104+09000&cl=
## 311    http://ntusweety.herokuapp.com/history?&id=104+10000&cl=
## 312  http://ntusweety.herokuapp.com/history?&id=104+10100&cl=01
## 313  http://ntusweety.herokuapp.com/history?&id=104+10100&cl=02
## 314  http://ntusweety.herokuapp.com/history?&id=104+10100&cl=03
## 315  http://ntusweety.herokuapp.com/history?&id=104+10100&cl=04
## 316  http://ntusweety.herokuapp.com/history?&id=104+12100&cl=01
## 317  http://ntusweety.herokuapp.com/history?&id=104+12100&cl=02
## 318    http://ntusweety.herokuapp.com/history?&id=104+16900&cl=
## 319    http://ntusweety.herokuapp.com/history?&id=104+18500&cl=
## 320    http://ntusweety.herokuapp.com/history?&id=104+18700&cl=
## 321    http://ntusweety.herokuapp.com/history?&id=104+19100&cl=
## 322    http://ntusweety.herokuapp.com/history?&id=104+20100&cl=
## 323    http://ntusweety.herokuapp.com/history?&id=104+30020&cl=
## 324    http://ntusweety.herokuapp.com/history?&id=104+32320&cl=
## 325    http://ntusweety.herokuapp.com/history?&id=104+44800&cl=
## 326    http://ntusweety.herokuapp.com/history?&id=104E45600&cl=
## 327    http://ntusweety.herokuapp.com/history?&id=104+47300&cl=
## 328    http://ntusweety.herokuapp.com/history?&id=104+47400&cl=
## 329    http://ntusweety.herokuapp.com/history?&id=104E48700&cl=
## 330    http://ntusweety.herokuapp.com/history?&id=105+12100&cl=
## 331    http://ntusweety.herokuapp.com/history?&id=105+201C0&cl=
## 332    http://ntusweety.herokuapp.com/history?&id=105+20220&cl=
## 333    http://ntusweety.herokuapp.com/history?&id=105+20300&cl=
## 334    http://ntusweety.herokuapp.com/history?&id=105+21400&cl=
## 335    http://ntusweety.herokuapp.com/history?&id=105+22000&cl=
## 336    http://ntusweety.herokuapp.com/history?&id=105+24300&cl=
## 337    http://ntusweety.herokuapp.com/history?&id=105+29930&cl=
## 338    http://ntusweety.herokuapp.com/history?&id=105+30402&cl=
## 339    http://ntusweety.herokuapp.com/history?&id=105+30502&cl=
## 340    http://ntusweety.herokuapp.com/history?&id=105+32000&cl=
## 341    http://ntusweety.herokuapp.com/history?&id=105+33000&cl=
## 342    http://ntusweety.herokuapp.com/history?&id=105+33400&cl=
## 343    http://ntusweety.herokuapp.com/history?&id=105+36500&cl=
## 344    http://ntusweety.herokuapp.com/history?&id=105+41810&cl=
## 345    http://ntusweety.herokuapp.com/history?&id=105+41880&cl=
## 346    http://ntusweety.herokuapp.com/history?&id=105+41910&cl=
## 347    http://ntusweety.herokuapp.com/history?&id=105+42110&cl=
## 348    http://ntusweety.herokuapp.com/history?&id=106+13400&cl=
## 349  http://ntusweety.herokuapp.com/history?&id=106+14220&cl=01
## 350    http://ntusweety.herokuapp.com/history?&id=106+15100&cl=
## 351    http://ntusweety.herokuapp.com/history?&id=106+26110&cl=
## 352    http://ntusweety.herokuapp.com/history?&id=106+31300&cl=
## 353    http://ntusweety.herokuapp.com/history?&id=106+33700&cl=
## 354    http://ntusweety.herokuapp.com/history?&id=106+34900&cl=
## 355    http://ntusweety.herokuapp.com/history?&id=106+35220&cl=
## 356    http://ntusweety.herokuapp.com/history?&id=106+36900&cl=
## 357  http://ntusweety.herokuapp.com/history?&id=106+37710&cl=04
## 358  http://ntusweety.herokuapp.com/history?&id=106+37710&cl=05
## 359  http://ntusweety.herokuapp.com/history?&id=106+37710&cl=08
## 360  http://ntusweety.herokuapp.com/history?&id=106+37710&cl=11
## 361  http://ntusweety.herokuapp.com/history?&id=106+37710&cl=13
## 362  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=02
## 363  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=04
## 364  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=05
## 365  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=07
## 366  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=08
## 367  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=09
## 368  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=10
## 369  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=11
## 370  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=12
## 371  http://ntusweety.herokuapp.com/history?&id=106+37720&cl=13
## 372    http://ntusweety.herokuapp.com/history?&id=106+42120&cl=
## 373    http://ntusweety.herokuapp.com/history?&id=106+43600&cl=
## 374    http://ntusweety.herokuapp.com/history?&id=106+45510&cl=
## 375    http://ntusweety.herokuapp.com/history?&id=106+47500&cl=
## 376    http://ntusweety.herokuapp.com/history?&id=106+49800&cl=
## 377    http://ntusweety.herokuapp.com/history?&id=106+50800&cl=
## 378    http://ntusweety.herokuapp.com/history?&id=107+10112&cl=
## 379  http://ntusweety.herokuapp.com/history?&id=107+10222&cl=01
## 380  http://ntusweety.herokuapp.com/history?&id=107+10222&cl=02
## 381  http://ntusweety.herokuapp.com/history?&id=107+10222&cl=03
## 382  http://ntusweety.herokuapp.com/history?&id=107+10312&cl=01
## 383  http://ntusweety.herokuapp.com/history?&id=107+10312&cl=02
## 384  http://ntusweety.herokuapp.com/history?&id=107+10312&cl=03
## 385  http://ntusweety.herokuapp.com/history?&id=107+10402&cl=01
## 386  http://ntusweety.herokuapp.com/history?&id=107+10402&cl=02
## 387  http://ntusweety.herokuapp.com/history?&id=107+10402&cl=03
## 388    http://ntusweety.herokuapp.com/history?&id=107+10520&cl=
## 389  http://ntusweety.herokuapp.com/history?&id=107+20102&cl=01
## 390  http://ntusweety.herokuapp.com/history?&id=107+20102&cl=02
## 391  http://ntusweety.herokuapp.com/history?&id=107+20222&cl=01
## 392  http://ntusweety.herokuapp.com/history?&id=107+20222&cl=02
## 393  http://ntusweety.herokuapp.com/history?&id=107+20222&cl=03
## 394    http://ntusweety.herokuapp.com/history?&id=107+20302&cl=
## 395  http://ntusweety.herokuapp.com/history?&id=107+20422&cl=01
## 396  http://ntusweety.herokuapp.com/history?&id=107+20422&cl=02
## 397  http://ntusweety.herokuapp.com/history?&id=107+20422&cl=03
## 398  http://ntusweety.herokuapp.com/history?&id=107+20502&cl=01
## 399  http://ntusweety.herokuapp.com/history?&id=107+20502&cl=02
## 400  http://ntusweety.herokuapp.com/history?&id=107+20502&cl=03
## 401    http://ntusweety.herokuapp.com/history?&id=107+20702&cl=
## 402  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=01
## 403  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=02
## 404  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=03
## 405  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=04
## 406  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=05
## 407  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=06
## 408  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=07
## 409  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=08
## 410  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=09
## 411  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=10
## 412  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=11
## 413  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=12
## 414  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=13
## 415  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=14
## 416  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=15
## 417  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=16
## 418  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=17
## 419  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=18
## 420  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=19
## 421  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=20
## 422  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=21
## 423  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=22
## 424  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=23
## 425  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=24
## 426  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=25
## 427  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=26
## 428  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=27
## 429  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=28
## 430  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=29
## 431  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=30
## 432  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=31
## 433  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=32
## 434  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=33
## 435  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=34
## 436  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=35
## 437  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=36
## 438  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=37
## 439  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=38
## 440  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=39
## 441  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=40
## 442  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=41
## 443  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=42
## 444  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=43
## 445  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=44
## 446  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=45
## 447  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=46
## 448  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=47
## 449  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=48
## 450  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=49
## 451  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=50
## 452  http://ntusweety.herokuapp.com/history?&id=107+22512&cl=51
## 453    http://ntusweety.herokuapp.com/history?&id=107+30102&cl=
## 454    http://ntusweety.herokuapp.com/history?&id=107+30202&cl=
## 455    http://ntusweety.herokuapp.com/history?&id=107+30302&cl=
## 456  http://ntusweety.herokuapp.com/history?&id=107+30422&cl=01
## 457  http://ntusweety.herokuapp.com/history?&id=107+30422&cl=02
## 458  http://ntusweety.herokuapp.com/history?&id=107+30422&cl=03
## 459  http://ntusweety.herokuapp.com/history?&id=107+30502&cl=01
## 460  http://ntusweety.herokuapp.com/history?&id=107+30502&cl=02
## 461    http://ntusweety.herokuapp.com/history?&id=107+30532&cl=
## 462    http://ntusweety.herokuapp.com/history?&id=107+30602&cl=
## 463    http://ntusweety.herokuapp.com/history?&id=107+32302&cl=
## 464    http://ntusweety.herokuapp.com/history?&id=107+32402&cl=
## 465  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=01
## 466  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=02
## 467  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=03
## 468  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=04
## 469  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=05
## 470  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=06
## 471  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=07
## 472  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=08
## 473  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=09
## 474  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=10
## 475  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=11
## 476  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=12
## 477  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=13
## 478  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=14
## 479  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=15
## 480  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=16
## 481  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=17
## 482  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=18
## 483  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=19
## 484  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=20
## 485  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=21
## 486  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=22
## 487  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=23
## 488  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=24
## 489  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=25
## 490  http://ntusweety.herokuapp.com/history?&id=107+32522&cl=26
## 491    http://ntusweety.herokuapp.com/history?&id=107+40112&cl=
## 492    http://ntusweety.herokuapp.com/history?&id=107+40402&cl=
## 493    http://ntusweety.herokuapp.com/history?&id=107+40502&cl=
## 494    http://ntusweety.herokuapp.com/history?&id=107+41002&cl=
## 495    http://ntusweety.herokuapp.com/history?&id=107+41402&cl=
## 496  http://ntusweety.herokuapp.com/history?&id=107+42532&cl=01
## 497  http://ntusweety.herokuapp.com/history?&id=107+42532&cl=02
## 498  http://ntusweety.herokuapp.com/history?&id=107+50012&cl=01
## 499  http://ntusweety.herokuapp.com/history?&id=107+50012&cl=02
## 500  http://ntusweety.herokuapp.com/history?&id=107+50012&cl=03
## 501  http://ntusweety.herokuapp.com/history?&id=107+50012&cl=04
## 502  http://ntusweety.herokuapp.com/history?&id=107+50012&cl=05
## 503    http://ntusweety.herokuapp.com/history?&id=107+50022&cl=
## 504  http://ntusweety.herokuapp.com/history?&id=107+50032&cl=01
## 505  http://ntusweety.herokuapp.com/history?&id=107+50032&cl=02
## 506    http://ntusweety.herokuapp.com/history?&id=107+50042&cl=
## 507    http://ntusweety.herokuapp.com/history?&id=107+50052&cl=
## 508    http://ntusweety.herokuapp.com/history?&id=107+50062&cl=
## 509  http://ntusweety.herokuapp.com/history?&id=107+50112&cl=01
## 510  http://ntusweety.herokuapp.com/history?&id=107+50112&cl=02
## 511    http://ntusweety.herokuapp.com/history?&id=107+50122&cl=
## 512    http://ntusweety.herokuapp.com/history?&id=107+50132&cl=
## 513    http://ntusweety.herokuapp.com/history?&id=107+50152&cl=
## 514  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=01
## 515  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=02
## 516  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=03
## 517  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=04
## 518  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=05
## 519  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=06
## 520  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=07
## 521  http://ntusweety.herokuapp.com/history?&id=107+80012&cl=08
## 522    http://ntusweety.herokuapp.com/history?&id=109+10030&cl=
## 523    http://ntusweety.herokuapp.com/history?&id=109+10110&cl=
## 524    http://ntusweety.herokuapp.com/history?&id=109+10200&cl=
## 525  http://ntusweety.herokuapp.com/history?&id=109+10702&cl=01
## 526  http://ntusweety.herokuapp.com/history?&id=109+10702&cl=02
## 527  http://ntusweety.herokuapp.com/history?&id=109+10712&cl=01
## 528  http://ntusweety.herokuapp.com/history?&id=109+10712&cl=02
## 529    http://ntusweety.herokuapp.com/history?&id=109+12100&cl=
## 530    http://ntusweety.herokuapp.com/history?&id=109+14130&cl=
## 531    http://ntusweety.herokuapp.com/history?&id=109+14140&cl=
## 532    http://ntusweety.herokuapp.com/history?&id=109+15400&cl=
## 533    http://ntusweety.herokuapp.com/history?&id=109+16200&cl=
## 534    http://ntusweety.herokuapp.com/history?&id=109+21020&cl=
## 535    http://ntusweety.herokuapp.com/history?&id=109+22010&cl=
## 536    http://ntusweety.herokuapp.com/history?&id=109+23050&cl=
## 537    http://ntusweety.herokuapp.com/history?&id=109+23210&cl=
## 538    http://ntusweety.herokuapp.com/history?&id=109+24010&cl=
## 539    http://ntusweety.herokuapp.com/history?&id=109+24110&cl=
## 540    http://ntusweety.herokuapp.com/history?&id=109+24210&cl=
## 541  http://ntusweety.herokuapp.com/history?&id=109+24310&cl=01
## 542  http://ntusweety.herokuapp.com/history?&id=109+24310&cl=02
## 543    http://ntusweety.herokuapp.com/history?&id=109+24490&cl=
## 544    http://ntusweety.herokuapp.com/history?&id=109+24610&cl=
## 545    http://ntusweety.herokuapp.com/history?&id=109+31002&cl=
## 546    http://ntusweety.herokuapp.com/history?&id=109+32012&cl=
## 547    http://ntusweety.herokuapp.com/history?&id=109+33230&cl=
## 548    http://ntusweety.herokuapp.com/history?&id=109+33250&cl=
## 549    http://ntusweety.herokuapp.com/history?&id=109+33330&cl=
## 550    http://ntusweety.herokuapp.com/history?&id=109+33430&cl=
## 551    http://ntusweety.herokuapp.com/history?&id=109+34220&cl=
## 552    http://ntusweety.herokuapp.com/history?&id=109+34310&cl=
## 553    http://ntusweety.herokuapp.com/history?&id=121+D0010&cl=
## 554    http://ntusweety.herokuapp.com/history?&id=121+M0010&cl=
## 555    http://ntusweety.herokuapp.com/history?&id=121+M0640&cl=
## 556    http://ntusweety.herokuapp.com/history?&id=121+M0700&cl=
## 557    http://ntusweety.herokuapp.com/history?&id=121+M0820&cl=
## 558  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=01
## 559  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=02
## 560  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=03
## 561  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=04
## 562  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=05
## 563  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=06
## 564  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=07
## 565  http://ntusweety.herokuapp.com/history?&id=121+M0960&cl=09
## 566    http://ntusweety.herokuapp.com/history?&id=121+M2270&cl=
## 567    http://ntusweety.herokuapp.com/history?&id=121+M3140&cl=
## 568    http://ntusweety.herokuapp.com/history?&id=122+D0010&cl=
## 569    http://ntusweety.herokuapp.com/history?&id=122+M0010&cl=
## 570    http://ntusweety.herokuapp.com/history?&id=122+M1042&cl=
## 571    http://ntusweety.herokuapp.com/history?&id=122EM2830&cl=
## 572    http://ntusweety.herokuapp.com/history?&id=122+M3520&cl=
## 573    http://ntusweety.herokuapp.com/history?&id=122+M3670&cl=
## 574    http://ntusweety.herokuapp.com/history?&id=122+U0740&cl=
## 575    http://ntusweety.herokuapp.com/history?&id=122+U0760&cl=
## 576    http://ntusweety.herokuapp.com/history?&id=122+U0780&cl=
## 577    http://ntusweety.herokuapp.com/history?&id=122+U1190&cl=
## 578    http://ntusweety.herokuapp.com/history?&id=122+U2290&cl=
## 579    http://ntusweety.herokuapp.com/history?&id=122+U2350&cl=
## 580    http://ntusweety.herokuapp.com/history?&id=123+D0010&cl=
## 581    http://ntusweety.herokuapp.com/history?&id=123+M0010&cl=
## 582  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=01
## 583  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=02
## 584  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=03
## 585  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=04
## 586  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=05
## 587  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=06
## 588  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=07
## 589  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=08
## 590  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=09
## 591  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=10
## 592  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=11
## 593  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=12
## 594  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=13
## 595  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=14
## 596  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=15
## 597  http://ntusweety.herokuapp.com/history?&id=123+M0040&cl=16
## 598    http://ntusweety.herokuapp.com/history?&id=123+M0042&cl=
## 599    http://ntusweety.herokuapp.com/history?&id=123+M0782&cl=
## 600    http://ntusweety.herokuapp.com/history?&id=123+M0840&cl=
## 601    http://ntusweety.herokuapp.com/history?&id=123+M1792&cl=
## 602    http://ntusweety.herokuapp.com/history?&id=123+M2530&cl=
## 603    http://ntusweety.herokuapp.com/history?&id=123+M6430&cl=
## 604    http://ntusweety.herokuapp.com/history?&id=123+M6460&cl=
## 605    http://ntusweety.herokuapp.com/history?&id=123+M6740&cl=
## 606    http://ntusweety.herokuapp.com/history?&id=123+M6750&cl=
## 607    http://ntusweety.herokuapp.com/history?&id=123+U5250&cl=
## 608    http://ntusweety.herokuapp.com/history?&id=123+U7590&cl=
## 609    http://ntusweety.herokuapp.com/history?&id=123+U7730&cl=
## 610    http://ntusweety.herokuapp.com/history?&id=123+U8030&cl=
## 611    http://ntusweety.herokuapp.com/history?&id=123+U8620&cl=
## 612    http://ntusweety.herokuapp.com/history?&id=123+U8720&cl=
## 613    http://ntusweety.herokuapp.com/history?&id=124+D0010&cl=
## 614    http://ntusweety.herokuapp.com/history?&id=124+D0102&cl=
## 615    http://ntusweety.herokuapp.com/history?&id=124+M0010&cl=
## 616    http://ntusweety.herokuapp.com/history?&id=124+M0280&cl=
## 617    http://ntusweety.herokuapp.com/history?&id=124+M0610&cl=
## 618    http://ntusweety.herokuapp.com/history?&id=124+M0670&cl=
## 619    http://ntusweety.herokuapp.com/history?&id=124+M1000&cl=
## 620    http://ntusweety.herokuapp.com/history?&id=124EM2960&cl=
## 621    http://ntusweety.herokuapp.com/history?&id=124+M4260&cl=
## 622    http://ntusweety.herokuapp.com/history?&id=124+M7310&cl=
## 623    http://ntusweety.herokuapp.com/history?&id=124EM7360&cl=
## 624    http://ntusweety.herokuapp.com/history?&id=124EM7390&cl=
## 625    http://ntusweety.herokuapp.com/history?&id=125+D0010&cl=
## 626  http://ntusweety.herokuapp.com/history?&id=125+D0030&cl=02
## 627    http://ntusweety.herokuapp.com/history?&id=125+M0010&cl=
## 628  http://ntusweety.herokuapp.com/history?&id=125+M1000&cl=01
## 629  http://ntusweety.herokuapp.com/history?&id=125+M1000&cl=02
## 630  http://ntusweety.herokuapp.com/history?&id=125+M1000&cl=03
## 631  http://ntusweety.herokuapp.com/history?&id=125+M1000&cl=04
## 632  http://ntusweety.herokuapp.com/history?&id=125+M1000&cl=05
## 633    http://ntusweety.herokuapp.com/history?&id=125+M2640&cl=
## 634    http://ntusweety.herokuapp.com/history?&id=125+M3060&cl=
## 635    http://ntusweety.herokuapp.com/history?&id=125+U2790&cl=
## 636    http://ntusweety.herokuapp.com/history?&id=125+U2880&cl=
## 637  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=01
## 638  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=02
## 639  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=03
## 640  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=04
## 641  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=05
## 642  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=07
## 643  http://ntusweety.herokuapp.com/history?&id=126+D0010&cl=08
## 644  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=02
## 645  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=03
## 646  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=05
## 647  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=06
## 648  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=08
## 649  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=09
## 650  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=11
## 651  http://ntusweety.herokuapp.com/history?&id=126+D0090&cl=13
## 652  http://ntusweety.herokuapp.com/history?&id=126+D0110&cl=02
## 653  http://ntusweety.herokuapp.com/history?&id=126+D0110&cl=03
## 654  http://ntusweety.herokuapp.com/history?&id=126+D0110&cl=09
## 655  http://ntusweety.herokuapp.com/history?&id=126+D0110&cl=10
## 656    http://ntusweety.herokuapp.com/history?&id=126+D1010&cl=
## 657    http://ntusweety.herokuapp.com/history?&id=126+D1040&cl=
## 658  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=01
## 659  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=02
## 660  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=03
## 661  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=04
## 662  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=05
## 663  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=06
## 664  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=07
## 665  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=08
## 666  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=09
## 667  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=10
## 668  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=11
## 669  http://ntusweety.herokuapp.com/history?&id=126+M0010&cl=12
## 670    http://ntusweety.herokuapp.com/history?&id=126+M0420&cl=
## 671  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=01
## 672  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=04
## 673  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=05
## 674  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=06
## 675  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=07
## 676  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=08
## 677  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=09
## 678  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=10
## 679  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=11
## 680  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=12
## 681  http://ntusweety.herokuapp.com/history?&id=126+M0550&cl=13
## 682  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=01
## 683  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=02
## 684  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=04
## 685  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=05
## 686  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=12
## 687  http://ntusweety.herokuapp.com/history?&id=126+M0560&cl=13
## 688    http://ntusweety.herokuapp.com/history?&id=126+M0570&cl=
## 689    http://ntusweety.herokuapp.com/history?&id=126+M0580&cl=
## 690    http://ntusweety.herokuapp.com/history?&id=126+M0630&cl=
## 691    http://ntusweety.herokuapp.com/history?&id=126+U0370&cl=
## 692    http://ntusweety.herokuapp.com/history?&id=126+U0620&cl=
## 693    http://ntusweety.herokuapp.com/history?&id=126+U1040&cl=
## 694    http://ntusweety.herokuapp.com/history?&id=126+U1340&cl=
## 695    http://ntusweety.herokuapp.com/history?&id=126+U1360&cl=
## 696    http://ntusweety.herokuapp.com/history?&id=126+U1380&cl=
## 697    http://ntusweety.herokuapp.com/history?&id=126+U1410&cl=
## 698    http://ntusweety.herokuapp.com/history?&id=127+M0010&cl=
## 699    http://ntusweety.herokuapp.com/history?&id=127+M0102&cl=
## 700    http://ntusweety.herokuapp.com/history?&id=127+M0212&cl=
## 701    http://ntusweety.herokuapp.com/history?&id=127+M0902&cl=
## 702    http://ntusweety.herokuapp.com/history?&id=127+M1202&cl=
## 703    http://ntusweety.herokuapp.com/history?&id=127+M1602&cl=
## 704    http://ntusweety.herokuapp.com/history?&id=127+M1702&cl=
## 705    http://ntusweety.herokuapp.com/history?&id=127+M2102&cl=
## 706    http://ntusweety.herokuapp.com/history?&id=127+M2402&cl=
## 707    http://ntusweety.herokuapp.com/history?&id=127+M2602&cl=
## 708    http://ntusweety.herokuapp.com/history?&id=129+M0010&cl=
## 709    http://ntusweety.herokuapp.com/history?&id=129+M2040&cl=
## 710    http://ntusweety.herokuapp.com/history?&id=129+U1160&cl=
## 711    http://ntusweety.herokuapp.com/history?&id=129+U1190&cl=
## 712    http://ntusweety.herokuapp.com/history?&id=129+U1240&cl=
## 713    http://ntusweety.herokuapp.com/history?&id=129+U3060&cl=
## 714    http://ntusweety.herokuapp.com/history?&id=129+U4350&cl=
## 715    http://ntusweety.herokuapp.com/history?&id=129+U4410&cl=
## 716    http://ntusweety.herokuapp.com/history?&id=141E10700&cl=
## 717    http://ntusweety.herokuapp.com/history?&id=141+11100&cl=
## 718    http://ntusweety.herokuapp.com/history?&id=141+D0010&cl=
## 719    http://ntusweety.herokuapp.com/history?&id=141+M0010&cl=
## 720    http://ntusweety.herokuapp.com/history?&id=141+M0300&cl=
## 721    http://ntusweety.herokuapp.com/history?&id=141+M0880&cl=
## 722    http://ntusweety.herokuapp.com/history?&id=141+M0990&cl=
## 723    http://ntusweety.herokuapp.com/history?&id=141EM1300&cl=
## 724    http://ntusweety.herokuapp.com/history?&id=141+U0580&cl=
## 725    http://ntusweety.herokuapp.com/history?&id=142+D0010&cl=
## 726    http://ntusweety.herokuapp.com/history?&id=142+M0010&cl=
## 727    http://ntusweety.herokuapp.com/history?&id=142+M0210&cl=
## 728    http://ntusweety.herokuapp.com/history?&id=142+M0310&cl=
## 729    http://ntusweety.herokuapp.com/history?&id=142+M0800&cl=
## 730    http://ntusweety.herokuapp.com/history?&id=142+M1020&cl=
## 731    http://ntusweety.herokuapp.com/history?&id=142+M1030&cl=
## 732    http://ntusweety.herokuapp.com/history?&id=142+M1070&cl=
## 733    http://ntusweety.herokuapp.com/history?&id=142+M1260&cl=
## 734    http://ntusweety.herokuapp.com/history?&id=142+U0640&cl=
## 735    http://ntusweety.herokuapp.com/history?&id=144+30400&cl=
## 736    http://ntusweety.herokuapp.com/history?&id=144+30500&cl=
## 737    http://ntusweety.herokuapp.com/history?&id=144+M0010&cl=
## 738    http://ntusweety.herokuapp.com/history?&id=144+M0110&cl=
## 739    http://ntusweety.herokuapp.com/history?&id=144+U0420&cl=
## 740    http://ntusweety.herokuapp.com/history?&id=144+U0540&cl=
## 741  http://ntusweety.herokuapp.com/history?&id=144+U0690&cl=01
## 742    http://ntusweety.herokuapp.com/history?&id=144+U0880&cl=
## 743    http://ntusweety.herokuapp.com/history?&id=144+U0930&cl=
## 744    http://ntusweety.herokuapp.com/history?&id=144EU1060&cl=
## 745    http://ntusweety.herokuapp.com/history?&id=145+10120&cl=
## 746    http://ntusweety.herokuapp.com/history?&id=145+D0010&cl=
## 747    http://ntusweety.herokuapp.com/history?&id=145+M0010&cl=
## 748    http://ntusweety.herokuapp.com/history?&id=145+M0022&cl=
## 749    http://ntusweety.herokuapp.com/history?&id=145+M0290&cl=
## 750    http://ntusweety.herokuapp.com/history?&id=145+M0620&cl=
## 751    http://ntusweety.herokuapp.com/history?&id=145+M0650&cl=
## 752    http://ntusweety.herokuapp.com/history?&id=145+M0740&cl=
## 753    http://ntusweety.herokuapp.com/history?&id=145+M0760&cl=
## 754    http://ntusweety.herokuapp.com/history?&id=145+U0010&cl=
## 755    http://ntusweety.herokuapp.com/history?&id=145+U0120&cl=
## 756    http://ntusweety.herokuapp.com/history?&id=145+U0251&cl=
## 757    http://ntusweety.herokuapp.com/history?&id=145+U0280&cl=
## 758    http://ntusweety.herokuapp.com/history?&id=146+M0010&cl=
## 759    http://ntusweety.herokuapp.com/history?&id=146+M0080&cl=
## 760    http://ntusweety.herokuapp.com/history?&id=146+M0100&cl=
## 761    http://ntusweety.herokuapp.com/history?&id=146+M0130&cl=
## 762    http://ntusweety.herokuapp.com/history?&id=146+M0150&cl=
## 763  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=01
## 764  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=02
## 765  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=03
## 766  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=04
## 767  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=05
## 768  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=06
## 769  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=07
## 770  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=08
## 771  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=09
## 772  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=10
## 773  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=11
## 774  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=12
## 775  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=13
## 776  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=14
## 777  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=15
## 778  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=16
## 779  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=17
## 780  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=18
## 781  http://ntusweety.herokuapp.com/history?&id=146+U9090&cl=19
## 782  http://ntusweety.herokuapp.com/history?&id=146+U9110&cl=01
## 783  http://ntusweety.herokuapp.com/history?&id=146+U9110&cl=02
## 784  http://ntusweety.herokuapp.com/history?&id=146+U9110&cl=03
## 785  http://ntusweety.herokuapp.com/history?&id=146+U9110&cl=04
## 786  http://ntusweety.herokuapp.com/history?&id=146+U9110&cl=05
## 787    http://ntusweety.herokuapp.com/history?&id=146+U9120&cl=
## 788    http://ntusweety.herokuapp.com/history?&id=146+U9130&cl=
## 789    http://ntusweety.herokuapp.com/history?&id=147+M0010&cl=
## 790    http://ntusweety.herokuapp.com/history?&id=147+M0020&cl=
## 791    http://ntusweety.herokuapp.com/history?&id=147+M0040&cl=
## 792  http://ntusweety.herokuapp.com/history?&id=147+M0050&cl=01
## 793    http://ntusweety.herokuapp.com/history?&id=147+M1030&cl=
## 794    http://ntusweety.herokuapp.com/history?&id=147+M1040&cl=
## 795  http://ntusweety.herokuapp.com/history?&id=147+M1060&cl=01
## 796  http://ntusweety.herokuapp.com/history?&id=147+M1060&cl=02
## 797  http://ntusweety.herokuapp.com/history?&id=147+M1070&cl=01
## 798    http://ntusweety.herokuapp.com/history?&id=147+M2040&cl=
## 799    http://ntusweety.herokuapp.com/history?&id=147+M2070&cl=
## 800    http://ntusweety.herokuapp.com/history?&id=147+M2110&cl=
## 801    http://ntusweety.herokuapp.com/history?&id=147+M3060&cl=
## 802    http://ntusweety.herokuapp.com/history?&id=147+M3070&cl=
## 803    http://ntusweety.herokuapp.com/history?&id=147+U0040&cl=
## 804  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=01
## 805  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=02
## 806  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=03
## 807  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=04
## 808  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=05
## 809  http://ntusweety.herokuapp.com/history?&id=201E101A2&cl=06
## 810  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=07
## 811  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=08
## 812  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=09
## 813  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=10
## 814  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=11
## 815  http://ntusweety.herokuapp.com/history?&id=201+101A2&cl=12
## 816  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=01
## 817  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=02
## 818  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=03
## 819  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=04
## 820  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=05
## 821  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=06
## 822  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=07
## 823  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=08
## 824  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=09
## 825  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=10
## 826  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=11
## 827  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=12
## 828  http://ntusweety.herokuapp.com/history?&id=201+101B2&cl=13
## 829    http://ntusweety.herokuapp.com/history?&id=201+38100&cl=
## 830    http://ntusweety.herokuapp.com/history?&id=201+45170&cl=
## 831  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=01
## 832  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=02
## 833  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=03
## 834  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=04
## 835  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=05
## 836  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=06
## 837  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=07
## 838  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=08
## 839  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=09
## 840  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=10
## 841  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=11
## 842  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=12
## 843  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=13
## 844  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=14
## 845  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=15
## 846  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=16
## 847  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=17
## 848  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=18
## 849  http://ntusweety.herokuapp.com/history?&id=202+101A2&cl=19
## 850  http://ntusweety.herokuapp.com/history?&id=202+101B0&cl=01
## 851  http://ntusweety.herokuapp.com/history?&id=202+101B0&cl=02
## 852  http://ntusweety.herokuapp.com/history?&id=202+101B2&cl=01
## 853  http://ntusweety.herokuapp.com/history?&id=202+101B2&cl=02
## 854    http://ntusweety.herokuapp.com/history?&id=202+101C2&cl=
## 855  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=01
## 856  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=02
## 857  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=03
## 858  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=04
## 859  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=06
## 860  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=07
## 861  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=08
## 862  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=09
## 863  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=10
## 864  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=11
## 865  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=12
## 866  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=13
## 867  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=14
## 868  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=15
## 869  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=16
## 870  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=17
## 871  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=18
## 872  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=19
## 873  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=20
## 874  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=21
## 875  http://ntusweety.herokuapp.com/history?&id=202+10502&cl=22
## 876    http://ntusweety.herokuapp.com/history?&id=202+10700&cl=
## 877    http://ntusweety.herokuapp.com/history?&id=202+20310&cl=
## 878    http://ntusweety.herokuapp.com/history?&id=202+21202&cl=
## 879    http://ntusweety.herokuapp.com/history?&id=202+27200&cl=
## 880    http://ntusweety.herokuapp.com/history?&id=202+27210&cl=
## 881    http://ntusweety.herokuapp.com/history?&id=202+30330&cl=
## 882    http://ntusweety.herokuapp.com/history?&id=202E30340&cl=
## 883    http://ntusweety.herokuapp.com/history?&id=202+30902&cl=
## 884  http://ntusweety.herokuapp.com/history?&id=202+36200&cl=01
## 885  http://ntusweety.herokuapp.com/history?&id=202+36200&cl=02
## 886    http://ntusweety.herokuapp.com/history?&id=202+40110&cl=
## 887    http://ntusweety.herokuapp.com/history?&id=202+40650&cl=
## 888    http://ntusweety.herokuapp.com/history?&id=203+10120&cl=
## 889  http://ntusweety.herokuapp.com/history?&id=203+101A2&cl=01
## 890  http://ntusweety.herokuapp.com/history?&id=203+101A2&cl=02
## 891  http://ntusweety.herokuapp.com/history?&id=203+101A2&cl=03
## 892  http://ntusweety.herokuapp.com/history?&id=203+101C0&cl=01
## 893  http://ntusweety.herokuapp.com/history?&id=203+101C0&cl=02
## 894  http://ntusweety.herokuapp.com/history?&id=203+101C0&cl=03
## 895  http://ntusweety.herokuapp.com/history?&id=203+101C0&cl=04
## 896  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=01
## 897  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=02
## 898  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=03
## 899  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=04
## 900  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=05
## 901  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=06
## 902  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=07
## 903  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=08
## 904  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=09
## 905  http://ntusweety.herokuapp.com/history?&id=203+10500&cl=10
## 906  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=01
## 907  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=02
## 908  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=03
## 909  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=04
## 910  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=05
## 911  http://ntusweety.herokuapp.com/history?&id=203+10502&cl=06
## 912  http://ntusweety.herokuapp.com/history?&id=203+11520&cl=01
## 913  http://ntusweety.herokuapp.com/history?&id=203+11520&cl=02
## 914    http://ntusweety.herokuapp.com/history?&id=203+211B2&cl=
## 915    http://ntusweety.herokuapp.com/history?&id=203+211D0&cl=
## 916    http://ntusweety.herokuapp.com/history?&id=203+21220&cl=
## 917  http://ntusweety.herokuapp.com/history?&id=203+21500&cl=01
## 918  http://ntusweety.herokuapp.com/history?&id=203+21500&cl=02
## 919  http://ntusweety.herokuapp.com/history?&id=203+21500&cl=03
## 920  http://ntusweety.herokuapp.com/history?&id=203+21500&cl=04
## 921  http://ntusweety.herokuapp.com/history?&id=203+215B2&cl=01
## 922  http://ntusweety.herokuapp.com/history?&id=203+215B2&cl=02
## 923  http://ntusweety.herokuapp.com/history?&id=203+215B2&cl=03
## 924  http://ntusweety.herokuapp.com/history?&id=203+22200&cl=01
## 925  http://ntusweety.herokuapp.com/history?&id=203+22200&cl=02
## 926  http://ntusweety.herokuapp.com/history?&id=203+22200&cl=03
## 927  http://ntusweety.herokuapp.com/history?&id=203+22200&cl=04
## 928    http://ntusweety.herokuapp.com/history?&id=203+22220&cl=
## 929  http://ntusweety.herokuapp.com/history?&id=203+222B2&cl=01
## 930  http://ntusweety.herokuapp.com/history?&id=203+222B2&cl=02
## 931  http://ntusweety.herokuapp.com/history?&id=203+222B2&cl=03
## 932  http://ntusweety.herokuapp.com/history?&id=203+22520&cl=01
## 933  http://ntusweety.herokuapp.com/history?&id=203+22520&cl=02
## 934  http://ntusweety.herokuapp.com/history?&id=203+22520&cl=03
## 935  http://ntusweety.herokuapp.com/history?&id=203+22520&cl=04
## 936  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=01
## 937  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=02
## 938  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=03
## 939  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=04
## 940  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=05
## 941  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=06
## 942  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=07
## 943  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=08
## 944  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=09
## 945  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=10
## 946  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=11
## 947  http://ntusweety.herokuapp.com/history?&id=203+225B0&cl=12
## 948  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=01
## 949  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=02
## 950  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=03
## 951  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=04
## 952  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=05
## 953  http://ntusweety.herokuapp.com/history?&id=203+225B2&cl=06
## 954    http://ntusweety.herokuapp.com/history?&id=203+33102&cl=
## 955    http://ntusweety.herokuapp.com/history?&id=203+33170&cl=
## 956    http://ntusweety.herokuapp.com/history?&id=203+33180&cl=
## 957  http://ntusweety.herokuapp.com/history?&id=203+33220&cl=01
## 958  http://ntusweety.herokuapp.com/history?&id=203+33220&cl=02
## 959  http://ntusweety.herokuapp.com/history?&id=203+33520&cl=01
## 960  http://ntusweety.herokuapp.com/history?&id=203+33520&cl=02
## 961    http://ntusweety.herokuapp.com/history?&id=203+34130&cl=
## 962    http://ntusweety.herokuapp.com/history?&id=203+34220&cl=
## 963    http://ntusweety.herokuapp.com/history?&id=203+40100&cl=
## 964  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=01
## 965  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=02
## 966  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=03
## 967  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=04
## 968  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=05
## 969  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=06
## 970  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=07
## 971  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=08
## 972  http://ntusweety.herokuapp.com/history?&id=203+40330&cl=09
## 973  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=08
## 974  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=12
## 975  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=15
## 976  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=24
## 977  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=27
## 978  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=29
## 979  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=31
## 980  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=34
## 981  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=35
## 982  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=36
## 983  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=37
## 984  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=40
## 985  http://ntusweety.herokuapp.com/history?&id=203+49140&cl=41
## 986  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=08
## 987  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=12
## 988  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=15
## 989  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=24
## 990  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=27
## 991  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=29
## 992  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=35
## 993  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=36
## 994  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=37
## 995  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=40
## 996  http://ntusweety.herokuapp.com/history?&id=203+49240&cl=41
## 997  http://ntusweety.herokuapp.com/history?&id=204+20800&cl=01
## 998  http://ntusweety.herokuapp.com/history?&id=204+20800&cl=02
## 999    http://ntusweety.herokuapp.com/history?&id=204+21600&cl=
## 1000   http://ntusweety.herokuapp.com/history?&id=204+21700&cl=
## 1001 http://ntusweety.herokuapp.com/history?&id=204+22500&cl=01
## 1002 http://ntusweety.herokuapp.com/history?&id=204+22500&cl=02
## 1003 http://ntusweety.herokuapp.com/history?&id=204+22500&cl=03
## 1004 http://ntusweety.herokuapp.com/history?&id=204+22500&cl=04
## 1005 http://ntusweety.herokuapp.com/history?&id=204+22500&cl=05
## 1006 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=01
## 1007 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=02
## 1008 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=03
## 1009 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=04
## 1010 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=05
## 1011 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=06
## 1012 http://ntusweety.herokuapp.com/history?&id=204+22600&cl=07
## 1013 http://ntusweety.herokuapp.com/history?&id=204E22600&cl=09
## 1014   http://ntusweety.herokuapp.com/history?&id=204+30110&cl=
## 1015   http://ntusweety.herokuapp.com/history?&id=204+33100&cl=
## 1016   http://ntusweety.herokuapp.com/history?&id=204+33200&cl=
## 1017 http://ntusweety.herokuapp.com/history?&id=204+34840&cl=01
## 1018 http://ntusweety.herokuapp.com/history?&id=204+34840&cl=02
## 1019 http://ntusweety.herokuapp.com/history?&id=204+34840&cl=03
## 1020   http://ntusweety.herokuapp.com/history?&id=204+40102&cl=
## 1021   http://ntusweety.herokuapp.com/history?&id=204+49002&cl=
## 1022   http://ntusweety.herokuapp.com/history?&id=204+49040&cl=
## 1023   http://ntusweety.herokuapp.com/history?&id=204+49050&cl=
## 1024   http://ntusweety.herokuapp.com/history?&id=204+49080&cl=
## 1025   http://ntusweety.herokuapp.com/history?&id=204+49100&cl=
## 1026   http://ntusweety.herokuapp.com/history?&id=204+49130&cl=
## 1027   http://ntusweety.herokuapp.com/history?&id=204+49240&cl=
## 1028 http://ntusweety.herokuapp.com/history?&id=204+49260&cl=01
## 1029 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=03
## 1030 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=05
## 1031 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=06
## 1032 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=08
## 1033 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=09
## 1034 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=10
## 1035 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=11
## 1036 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=12
## 1037 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=13
## 1038 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=14
## 1039 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=16
## 1040 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=18
## 1041 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=19
## 1042 http://ntusweety.herokuapp.com/history?&id=204+49290&cl=20
## 1043   http://ntusweety.herokuapp.com/history?&id=204+49340&cl=
## 1044 http://ntusweety.herokuapp.com/history?&id=207+10100&cl=02
## 1045 http://ntusweety.herokuapp.com/history?&id=207+10100&cl=03
## 1046   http://ntusweety.herokuapp.com/history?&id=207+10120&cl=
## 1047   http://ntusweety.herokuapp.com/history?&id=207+12002&cl=
## 1048   http://ntusweety.herokuapp.com/history?&id=207+21302&cl=
## 1049   http://ntusweety.herokuapp.com/history?&id=207+34500&cl=
## 1050   http://ntusweety.herokuapp.com/history?&id=207+36100&cl=
## 1051   http://ntusweety.herokuapp.com/history?&id=207+37100&cl=
## 1052   http://ntusweety.herokuapp.com/history?&id=208+11000&cl=
## 1053   http://ntusweety.herokuapp.com/history?&id=208+11600&cl=
## 1054   http://ntusweety.herokuapp.com/history?&id=208+21500&cl=
## 1055   http://ntusweety.herokuapp.com/history?&id=208+26520&cl=
## 1056   http://ntusweety.herokuapp.com/history?&id=208+26710&cl=
## 1057   http://ntusweety.herokuapp.com/history?&id=208+37300&cl=
## 1058   http://ntusweety.herokuapp.com/history?&id=208+39220&cl=
## 1059 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=05
## 1060 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=07
## 1061 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=08
## 1062 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=10
## 1063 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=13
## 1064 http://ntusweety.herokuapp.com/history?&id=208+40402&cl=14
## 1065   http://ntusweety.herokuapp.com/history?&id=208+49100&cl=
## 1066   http://ntusweety.herokuapp.com/history?&id=209+10120&cl=
## 1067   http://ntusweety.herokuapp.com/history?&id=209+11900&cl=
## 1068   http://ntusweety.herokuapp.com/history?&id=209+12000&cl=
## 1069   http://ntusweety.herokuapp.com/history?&id=209+20100&cl=
## 1070   http://ntusweety.herokuapp.com/history?&id=209+26400&cl=
## 1071   http://ntusweety.herokuapp.com/history?&id=209+27120&cl=
## 1072   http://ntusweety.herokuapp.com/history?&id=209+30120&cl=
## 1073   http://ntusweety.herokuapp.com/history?&id=209+30320&cl=
## 1074   http://ntusweety.herokuapp.com/history?&id=209+32400&cl=
## 1075   http://ntusweety.herokuapp.com/history?&id=209+32600&cl=
## 1076   http://ntusweety.herokuapp.com/history?&id=209+40120&cl=
## 1077   http://ntusweety.herokuapp.com/history?&id=209+46110&cl=
## 1078   http://ntusweety.herokuapp.com/history?&id=209+46200&cl=
## 1079   http://ntusweety.herokuapp.com/history?&id=221+D0010&cl=
## 1080   http://ntusweety.herokuapp.com/history?&id=221+M0010&cl=
## 1081   http://ntusweety.herokuapp.com/history?&id=221+U0340&cl=
## 1082   http://ntusweety.herokuapp.com/history?&id=221+U1310&cl=
## 1083   http://ntusweety.herokuapp.com/history?&id=221+U1580&cl=
## 1084   http://ntusweety.herokuapp.com/history?&id=221+U2880&cl=
## 1085   http://ntusweety.herokuapp.com/history?&id=221+U2940&cl=
## 1086   http://ntusweety.herokuapp.com/history?&id=221+U3420&cl=
## 1087   http://ntusweety.herokuapp.com/history?&id=221+U3860&cl=
## 1088   http://ntusweety.herokuapp.com/history?&id=221+U3880&cl=
## 1089   http://ntusweety.herokuapp.com/history?&id=221+U3900&cl=
## 1090   http://ntusweety.herokuapp.com/history?&id=221+U4350&cl=
## 1091   http://ntusweety.herokuapp.com/history?&id=221+U5700&cl=
## 1092   http://ntusweety.herokuapp.com/history?&id=221+U6120&cl=
## 1093   http://ntusweety.herokuapp.com/history?&id=221+U6130&cl=
## 1094   http://ntusweety.herokuapp.com/history?&id=221+U6150&cl=
## 1095   http://ntusweety.herokuapp.com/history?&id=221+U6160&cl=
## 1096   http://ntusweety.herokuapp.com/history?&id=222+D0010&cl=
## 1097 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=01
## 1098 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=02
## 1099 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=03
## 1100 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=04
## 1101 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=05
## 1102 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=07
## 1103 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=09
## 1104 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=11
## 1105 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=12
## 1106 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=15
## 1107 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=16
## 1108 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=17
## 1109 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=18
## 1110 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=19
## 1111 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=23
## 1112 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=25
## 1113 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=26
## 1114 http://ntusweety.herokuapp.com/history?&id=222ED0020&cl=30
## 1115 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=33
## 1116 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=34
## 1117 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=36
## 1118 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=42
## 1119 http://ntusweety.herokuapp.com/history?&id=222+D0020&cl=43
## 1120   http://ntusweety.herokuapp.com/history?&id=222+D1210&cl=
## 1121   http://ntusweety.herokuapp.com/history?&id=222+D1320&cl=
## 1122   http://ntusweety.herokuapp.com/history?&id=222+D1430&cl=
## 1123   http://ntusweety.herokuapp.com/history?&id=222+D1680&cl=
## 1124   http://ntusweety.herokuapp.com/history?&id=222+D1750&cl=
## 1125   http://ntusweety.herokuapp.com/history?&id=222+D2920&cl=
## 1126   http://ntusweety.herokuapp.com/history?&id=222+D3040&cl=
## 1127   http://ntusweety.herokuapp.com/history?&id=222+D3110&cl=
## 1128   http://ntusweety.herokuapp.com/history?&id=222ED3190&cl=
## 1129   http://ntusweety.herokuapp.com/history?&id=222+D3240&cl=
## 1130   http://ntusweety.herokuapp.com/history?&id=222ED5030&cl=
## 1131   http://ntusweety.herokuapp.com/history?&id=222ED5100&cl=
## 1132   http://ntusweety.herokuapp.com/history?&id=222ED5130&cl=
## 1133 http://ntusweety.herokuapp.com/history?&id=222ED5350&cl=01
## 1134 http://ntusweety.herokuapp.com/history?&id=222ED5350&cl=02
## 1135   http://ntusweety.herokuapp.com/history?&id=222ED5390&cl=
## 1136   http://ntusweety.herokuapp.com/history?&id=222+M0010&cl=
## 1137 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=01
## 1138 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=02
## 1139 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=03
## 1140 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=04
## 1141 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=05
## 1142 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=07
## 1143 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=09
## 1144 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=11
## 1145 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=12
## 1146 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=15
## 1147 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=16
## 1148 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=17
## 1149 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=18
## 1150 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=19
## 1151 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=25
## 1152 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=26
## 1153 http://ntusweety.herokuapp.com/history?&id=222EM0020&cl=30
## 1154 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=33
## 1155 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=34
## 1156 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=36
## 1157 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=37
## 1158 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=40
## 1159 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=42
## 1160 http://ntusweety.herokuapp.com/history?&id=222+M0020&cl=43
## 1161   http://ntusweety.herokuapp.com/history?&id=222+M0150&cl=
## 1162 http://ntusweety.herokuapp.com/history?&id=222+M1420&cl=01
## 1163 http://ntusweety.herokuapp.com/history?&id=222+M1420&cl=02
## 1164   http://ntusweety.herokuapp.com/history?&id=222+U0330&cl=
## 1165 http://ntusweety.herokuapp.com/history?&id=222+U2070&cl=01
## 1166 http://ntusweety.herokuapp.com/history?&id=222+U2070&cl=02
## 1167 http://ntusweety.herokuapp.com/history?&id=222+U2070&cl=03
## 1168 http://ntusweety.herokuapp.com/history?&id=222+U2070&cl=04
## 1169 http://ntusweety.herokuapp.com/history?&id=222+U2080&cl=01
## 1170 http://ntusweety.herokuapp.com/history?&id=222+U2080&cl=02
## 1171 http://ntusweety.herokuapp.com/history?&id=222+U2080&cl=03
## 1172   http://ntusweety.herokuapp.com/history?&id=222+U2120&cl=
## 1173   http://ntusweety.herokuapp.com/history?&id=222EU2230&cl=
## 1174   http://ntusweety.herokuapp.com/history?&id=223+D0010&cl=
## 1175 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=01
## 1176 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=05
## 1177 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=08
## 1178 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=11
## 1179 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=12
## 1180 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=15
## 1181 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=16
## 1182 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=20
## 1183 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=21
## 1184 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=23
## 1185 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=24
## 1186 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=25
## 1187 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=27
## 1188 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=29
## 1189 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=30
## 1190 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=31
## 1191 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=32
## 1192 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=34
## 1193 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=35
## 1194 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=38
## 1195 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=39
## 1196 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=41
## 1197 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=42
## 1198 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=43
## 1199 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=44
## 1200 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=46
## 1201 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=47
## 1202 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=48
## 1203 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=49
## 1204 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=71
## 1205 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=73
## 1206 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=74
## 1207 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=76
## 1208 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=80
## 1209 http://ntusweety.herokuapp.com/history?&id=223+D0020&cl=84
## 1210 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=01
## 1211 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=05
## 1212 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=11
## 1213 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=12
## 1214 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=15
## 1215 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=16
## 1216 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=20
## 1217 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=23
## 1218 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=24
## 1219 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=25
## 1220 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=27
## 1221 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=29
## 1222 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=30
## 1223 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=31
## 1224 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=32
## 1225 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=33
## 1226 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=34
## 1227 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=35
## 1228 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=38
## 1229 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=39
## 1230 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=40
## 1231 http://ntusweety.herokuapp.com/history?&id=223+D0090&cl=43
## 1232   http://ntusweety.herokuapp.com/history?&id=223+D1140&cl=
## 1233   http://ntusweety.herokuapp.com/history?&id=223+D1230&cl=
## 1234   http://ntusweety.herokuapp.com/history?&id=223ED1320&cl=
## 1235   http://ntusweety.herokuapp.com/history?&id=223+D1420&cl=
## 1236   http://ntusweety.herokuapp.com/history?&id=223ED1620&cl=
## 1237   http://ntusweety.herokuapp.com/history?&id=223ED9210&cl=
## 1238   http://ntusweety.herokuapp.com/history?&id=223ED9220&cl=
## 1239   http://ntusweety.herokuapp.com/history?&id=223ED9230&cl=
## 1240   http://ntusweety.herokuapp.com/history?&id=223ED9240&cl=
## 1241   http://ntusweety.herokuapp.com/history?&id=223ED9260&cl=
## 1242   http://ntusweety.herokuapp.com/history?&id=223+M0010&cl=
## 1243 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=01
## 1244 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=05
## 1245 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=08
## 1246 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=11
## 1247 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=12
## 1248 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=15
## 1249 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=16
## 1250 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=20
## 1251 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=21
## 1252 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=23
## 1253 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=24
## 1254 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=25
## 1255 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=27
## 1256 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=29
## 1257 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=30
## 1258 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=31
## 1259 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=32
## 1260 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=34
## 1261 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=35
## 1262 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=36
## 1263 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=37
## 1264 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=38
## 1265 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=39
## 1266 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=40
## 1267 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=41
## 1268 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=42
## 1269 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=43
## 1270 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=44
## 1271 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=45
## 1272 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=46
## 1273 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=48
## 1274 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=51
## 1275 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=52
## 1276 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=54
## 1277 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=72
## 1278 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=73
## 1279 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=74
## 1280 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=75
## 1281 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=76
## 1282 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=78
## 1283 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=81
## 1284 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=82
## 1285 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=83
## 1286 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=84
## 1287 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=85
## 1288 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=86
## 1289 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=88
## 1290 http://ntusweety.herokuapp.com/history?&id=223+M0020&cl=89
## 1291 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=01
## 1292 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=05
## 1293 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=08
## 1294 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=11
## 1295 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=12
## 1296 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=15
## 1297 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=16
## 1298 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=20
## 1299 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=21
## 1300 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=23
## 1301 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=24
## 1302 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=25
## 1303 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=27
## 1304 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=29
## 1305 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=30
## 1306 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=31
## 1307 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=32
## 1308 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=34
## 1309 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=35
## 1310 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=36
## 1311 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=37
## 1312 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=38
## 1313 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=39
## 1314 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=40
## 1315 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=41
## 1316 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=42
## 1317 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=43
## 1318 http://ntusweety.herokuapp.com/history?&id=223+M0090&cl=44
## 1319   http://ntusweety.herokuapp.com/history?&id=223+M1140&cl=
## 1320   http://ntusweety.herokuapp.com/history?&id=223+M1230&cl=
## 1321   http://ntusweety.herokuapp.com/history?&id=223EM1320&cl=
## 1322   http://ntusweety.herokuapp.com/history?&id=223+M1420&cl=
## 1323   http://ntusweety.herokuapp.com/history?&id=223EM1620&cl=
## 1324   http://ntusweety.herokuapp.com/history?&id=223+U0500&cl=
## 1325   http://ntusweety.herokuapp.com/history?&id=223+U0770&cl=
## 1326   http://ntusweety.herokuapp.com/history?&id=223+U0860&cl=
## 1327   http://ntusweety.herokuapp.com/history?&id=223+U0910&cl=
## 1328   http://ntusweety.herokuapp.com/history?&id=223+U1400&cl=
## 1329   http://ntusweety.herokuapp.com/history?&id=223+U2510&cl=
## 1330   http://ntusweety.herokuapp.com/history?&id=223+U2650&cl=
## 1331   http://ntusweety.herokuapp.com/history?&id=223EU9110&cl=
## 1332   http://ntusweety.herokuapp.com/history?&id=224+D0010&cl=
## 1333   http://ntusweety.herokuapp.com/history?&id=224+D0050&cl=
## 1334   http://ntusweety.herokuapp.com/history?&id=224+D1720&cl=
## 1335   http://ntusweety.herokuapp.com/history?&id=224+D1970&cl=
## 1336   http://ntusweety.herokuapp.com/history?&id=224+M0130&cl=
## 1337 http://ntusweety.herokuapp.com/history?&id=224+M1410&cl=01
## 1338 http://ntusweety.herokuapp.com/history?&id=224+M1410&cl=02
## 1339   http://ntusweety.herokuapp.com/history?&id=224+M1710&cl=
## 1340   http://ntusweety.herokuapp.com/history?&id=224+M1720&cl=
## 1341   http://ntusweety.herokuapp.com/history?&id=224+M1750&cl=
## 1342   http://ntusweety.herokuapp.com/history?&id=224+M2600&cl=
## 1343   http://ntusweety.herokuapp.com/history?&id=224+M2670&cl=
## 1344   http://ntusweety.herokuapp.com/history?&id=224+U0420&cl=
## 1345   http://ntusweety.herokuapp.com/history?&id=224+U0910&cl=
## 1346   http://ntusweety.herokuapp.com/history?&id=224+U1410&cl=
## 1347   http://ntusweety.herokuapp.com/history?&id=224+U1800&cl=
## 1348   http://ntusweety.herokuapp.com/history?&id=224+U2090&cl=
## 1349   http://ntusweety.herokuapp.com/history?&id=224+U2110&cl=
## 1350   http://ntusweety.herokuapp.com/history?&id=224+U2290&cl=
## 1351   http://ntusweety.herokuapp.com/history?&id=224+U2510&cl=
## 1352   http://ntusweety.herokuapp.com/history?&id=227+D0010&cl=
## 1353   http://ntusweety.herokuapp.com/history?&id=227+D0060&cl=
## 1354   http://ntusweety.herokuapp.com/history?&id=227+D0880&cl=
## 1355   http://ntusweety.herokuapp.com/history?&id=227+D1010&cl=
## 1356   http://ntusweety.herokuapp.com/history?&id=227+D3530&cl=
## 1357   http://ntusweety.herokuapp.com/history?&id=227+M0010&cl=
## 1358   http://ntusweety.herokuapp.com/history?&id=227+M0050&cl=
## 1359   http://ntusweety.herokuapp.com/history?&id=227+M1760&cl=
## 1360   http://ntusweety.herokuapp.com/history?&id=227+M2360&cl=
## 1361   http://ntusweety.herokuapp.com/history?&id=227+M3020&cl=
## 1362   http://ntusweety.herokuapp.com/history?&id=227+M3060&cl=
## 1363   http://ntusweety.herokuapp.com/history?&id=227+M4030&cl=
## 1364   http://ntusweety.herokuapp.com/history?&id=227+M4180&cl=
## 1365   http://ntusweety.herokuapp.com/history?&id=227+M5210&cl=
## 1366   http://ntusweety.herokuapp.com/history?&id=227+M6032&cl=
## 1367   http://ntusweety.herokuapp.com/history?&id=227+M6042&cl=
## 1368   http://ntusweety.herokuapp.com/history?&id=227+M7040&cl=
## 1369   http://ntusweety.herokuapp.com/history?&id=227+M7070&cl=
## 1370   http://ntusweety.herokuapp.com/history?&id=227+M7080&cl=
## 1371   http://ntusweety.herokuapp.com/history?&id=227+M7090&cl=
## 1372   http://ntusweety.herokuapp.com/history?&id=227+M7380&cl=
## 1373   http://ntusweety.herokuapp.com/history?&id=227+M7610&cl=
## 1374   http://ntusweety.herokuapp.com/history?&id=227+M8600&cl=
## 1375   http://ntusweety.herokuapp.com/history?&id=227+M8810&cl=
## 1376   http://ntusweety.herokuapp.com/history?&id=227+U0840&cl=
## 1377   http://ntusweety.herokuapp.com/history?&id=227+U1900&cl=
## 1378   http://ntusweety.herokuapp.com/history?&id=227+U6180&cl=
## 1379   http://ntusweety.herokuapp.com/history?&id=227+U6470&cl=
## 1380   http://ntusweety.herokuapp.com/history?&id=227+U7000&cl=
## 1381   http://ntusweety.herokuapp.com/history?&id=227+U7910&cl=
## 1382   http://ntusweety.herokuapp.com/history?&id=227+U8020&cl=
## 1383   http://ntusweety.herokuapp.com/history?&id=227+U8230&cl=
## 1384   http://ntusweety.herokuapp.com/history?&id=227EU9060&cl=
## 1385   http://ntusweety.herokuapp.com/history?&id=228+D0010&cl=
## 1386   http://ntusweety.herokuapp.com/history?&id=228+D0050&cl=
## 1387   http://ntusweety.herokuapp.com/history?&id=228+D0080&cl=
## 1388   http://ntusweety.herokuapp.com/history?&id=228+D0170&cl=
## 1389   http://ntusweety.herokuapp.com/history?&id=228+D0180&cl=
## 1390   http://ntusweety.herokuapp.com/history?&id=228+M0010&cl=
## 1391   http://ntusweety.herokuapp.com/history?&id=228+M0060&cl=
## 1392   http://ntusweety.herokuapp.com/history?&id=228+M1150&cl=
## 1393   http://ntusweety.herokuapp.com/history?&id=228+M2710&cl=
## 1394   http://ntusweety.herokuapp.com/history?&id=228+M2810&cl=
## 1395   http://ntusweety.herokuapp.com/history?&id=228+M4700&cl=
## 1396   http://ntusweety.herokuapp.com/history?&id=228+M5850&cl=
## 1397   http://ntusweety.herokuapp.com/history?&id=228+M7360&cl=
## 1398   http://ntusweety.herokuapp.com/history?&id=228+M8340&cl=
## 1399   http://ntusweety.herokuapp.com/history?&id=228+M9000&cl=
## 1400   http://ntusweety.herokuapp.com/history?&id=228+U1600&cl=
## 1401   http://ntusweety.herokuapp.com/history?&id=228+U2070&cl=
## 1402   http://ntusweety.herokuapp.com/history?&id=228+U2410&cl=
## 1403   http://ntusweety.herokuapp.com/history?&id=228+U2520&cl=
## 1404   http://ntusweety.herokuapp.com/history?&id=228+U2940&cl=
## 1405   http://ntusweety.herokuapp.com/history?&id=229+D0010&cl=
## 1406   http://ntusweety.herokuapp.com/history?&id=229+D0030&cl=
## 1407   http://ntusweety.herokuapp.com/history?&id=229+D0050&cl=
## 1408   http://ntusweety.herokuapp.com/history?&id=229+D4200&cl=
## 1409   http://ntusweety.herokuapp.com/history?&id=229+M0010&cl=
## 1410 http://ntusweety.herokuapp.com/history?&id=229+M0050&cl=01
## 1411 http://ntusweety.herokuapp.com/history?&id=229+M0050&cl=03
## 1412 http://ntusweety.herokuapp.com/history?&id=229+M0070&cl=01
## 1413 http://ntusweety.herokuapp.com/history?&id=229+M0070&cl=02
## 1414 http://ntusweety.herokuapp.com/history?&id=229+M0070&cl=03
## 1415   http://ntusweety.herokuapp.com/history?&id=229+M3050&cl=
## 1416   http://ntusweety.herokuapp.com/history?&id=229+U2040&cl=
## 1417   http://ntusweety.herokuapp.com/history?&id=229+U4170&cl=
## 1418   http://ntusweety.herokuapp.com/history?&id=229+U5310&cl=
## 1419   http://ntusweety.herokuapp.com/history?&id=229+U5480&cl=
## 1420   http://ntusweety.herokuapp.com/history?&id=229+U5560&cl=
## 1421   http://ntusweety.herokuapp.com/history?&id=229+U5660&cl=
## 1422   http://ntusweety.herokuapp.com/history?&id=241+D0010&cl=
## 1423 http://ntusweety.herokuapp.com/history?&id=241ED0470&cl=02
## 1424 http://ntusweety.herokuapp.com/history?&id=241+D0470&cl=03
## 1425   http://ntusweety.herokuapp.com/history?&id=241+D0520&cl=
## 1426   http://ntusweety.herokuapp.com/history?&id=241+M0010&cl=
## 1427   http://ntusweety.herokuapp.com/history?&id=241+M0020&cl=
## 1428   http://ntusweety.herokuapp.com/history?&id=241+M0030&cl=
## 1429   http://ntusweety.herokuapp.com/history?&id=241+M0042&cl=
## 1430   http://ntusweety.herokuapp.com/history?&id=241+M0050&cl=
## 1431   http://ntusweety.herokuapp.com/history?&id=241+M0072&cl=
## 1432   http://ntusweety.herokuapp.com/history?&id=241+M1141&cl=
## 1433   http://ntusweety.herokuapp.com/history?&id=241+M1970&cl=
## 1434   http://ntusweety.herokuapp.com/history?&id=241+M2370&cl=
## 1435   http://ntusweety.herokuapp.com/history?&id=241+M2530&cl=
## 1436   http://ntusweety.herokuapp.com/history?&id=241+M2780&cl=
## 1437   http://ntusweety.herokuapp.com/history?&id=241+M2900&cl=
## 1438   http://ntusweety.herokuapp.com/history?&id=241+M2960&cl=
## 1439   http://ntusweety.herokuapp.com/history?&id=241+M2970&cl=
## 1440   http://ntusweety.herokuapp.com/history?&id=241+M3010&cl=
## 1441   http://ntusweety.herokuapp.com/history?&id=241+M3052&cl=
## 1442   http://ntusweety.herokuapp.com/history?&id=241+M3090&cl=
## 1443   http://ntusweety.herokuapp.com/history?&id=241+M3150&cl=
## 1444   http://ntusweety.herokuapp.com/history?&id=241+M3270&cl=
## 1445   http://ntusweety.herokuapp.com/history?&id=241+M3330&cl=
## 1446   http://ntusweety.herokuapp.com/history?&id=241+M3340&cl=
## 1447   http://ntusweety.herokuapp.com/history?&id=241+M3380&cl=
## 1448   http://ntusweety.herokuapp.com/history?&id=241+M3390&cl=
## 1449   http://ntusweety.herokuapp.com/history?&id=241+M3500&cl=
## 1450   http://ntusweety.herokuapp.com/history?&id=241+M3510&cl=
## 1451   http://ntusweety.herokuapp.com/history?&id=241EM3640&cl=
## 1452   http://ntusweety.herokuapp.com/history?&id=241+M3710&cl=
## 1453   http://ntusweety.herokuapp.com/history?&id=241+U0010&cl=
## 1454 http://ntusweety.herokuapp.com/history?&id=241+U0750&cl=01
## 1455 http://ntusweety.herokuapp.com/history?&id=241+U0750&cl=02
## 1456   http://ntusweety.herokuapp.com/history?&id=241+U1300&cl=
## 1457   http://ntusweety.herokuapp.com/history?&id=241+U1760&cl=
## 1458   http://ntusweety.herokuapp.com/history?&id=241+U1770&cl=
## 1459   http://ntusweety.herokuapp.com/history?&id=241+U1780&cl=
## 1460   http://ntusweety.herokuapp.com/history?&id=241+U1830&cl=
## 1461   http://ntusweety.herokuapp.com/history?&id=241+U1880&cl=
## 1462   http://ntusweety.herokuapp.com/history?&id=241+U1900&cl=
## 1463   http://ntusweety.herokuapp.com/history?&id=241EU1920&cl=
## 1464   http://ntusweety.herokuapp.com/history?&id=241+U1980&cl=
## 1465   http://ntusweety.herokuapp.com/history?&id=241+U2020&cl=
## 1466   http://ntusweety.herokuapp.com/history?&id=241EU2080&cl=
## 1467   http://ntusweety.herokuapp.com/history?&id=241+U3040&cl=
## 1468   http://ntusweety.herokuapp.com/history?&id=241EU4020&cl=
## 1469   http://ntusweety.herokuapp.com/history?&id=244+D0010&cl=
## 1470 http://ntusweety.herokuapp.com/history?&id=244+D0020&cl=01
## 1471 http://ntusweety.herokuapp.com/history?&id=244+D0020&cl=02
## 1472 http://ntusweety.herokuapp.com/history?&id=244+D0020&cl=03
## 1473   http://ntusweety.herokuapp.com/history?&id=244+D0050&cl=
## 1474   http://ntusweety.herokuapp.com/history?&id=244+D1040&cl=
## 1475   http://ntusweety.herokuapp.com/history?&id=244+D1120&cl=
## 1476   http://ntusweety.herokuapp.com/history?&id=244+M0010&cl=
## 1477 http://ntusweety.herokuapp.com/history?&id=244+M0020&cl=01
## 1478   http://ntusweety.herokuapp.com/history?&id=244+M0090&cl=
## 1479   http://ntusweety.herokuapp.com/history?&id=244+M1140&cl=
## 1480   http://ntusweety.herokuapp.com/history?&id=245+D0010&cl=
## 1481   http://ntusweety.herokuapp.com/history?&id=245+D0050&cl=
## 1482   http://ntusweety.herokuapp.com/history?&id=245+M0010&cl=
## 1483   http://ntusweety.herokuapp.com/history?&id=245+M0050&cl=
## 1484   http://ntusweety.herokuapp.com/history?&id=245+M0070&cl=
## 1485 http://ntusweety.herokuapp.com/history?&id=302+10120&cl=01
## 1486 http://ntusweety.herokuapp.com/history?&id=302+10120&cl=02
## 1487 http://ntusweety.herokuapp.com/history?&id=302+10120&cl=03
## 1488 http://ntusweety.herokuapp.com/history?&id=302+10350&cl=01
## 1489 http://ntusweety.herokuapp.com/history?&id=302+10350&cl=02
## 1490 http://ntusweety.herokuapp.com/history?&id=302+10350&cl=03
## 1491 http://ntusweety.herokuapp.com/history?&id=302+10420&cl=01
## 1492 http://ntusweety.herokuapp.com/history?&id=302+10420&cl=02
## 1493   http://ntusweety.herokuapp.com/history?&id=302+20130&cl=
## 1494   http://ntusweety.herokuapp.com/history?&id=302+23410&cl=
## 1495 http://ntusweety.herokuapp.com/history?&id=302+24420&cl=01
## 1496 http://ntusweety.herokuapp.com/history?&id=302+24420&cl=02
## 1497 http://ntusweety.herokuapp.com/history?&id=302+24420&cl=03
## 1498 http://ntusweety.herokuapp.com/history?&id=302+24620&cl=01
## 1499 http://ntusweety.herokuapp.com/history?&id=302+24620&cl=02
## 1500 http://ntusweety.herokuapp.com/history?&id=302+24620&cl=03
## 1501   http://ntusweety.herokuapp.com/history?&id=302+24720&cl=
## 1502   http://ntusweety.herokuapp.com/history?&id=302+27420&cl=
## 1503 http://ntusweety.herokuapp.com/history?&id=302+29220&cl=01
## 1504 http://ntusweety.herokuapp.com/history?&id=302+29220&cl=02
## 1505 http://ntusweety.herokuapp.com/history?&id=302+29220&cl=03
## 1506   http://ntusweety.herokuapp.com/history?&id=302+30120&cl=
## 1507 http://ntusweety.herokuapp.com/history?&id=302+30560&cl=01
## 1508 http://ntusweety.herokuapp.com/history?&id=302+30560&cl=02
## 1509   http://ntusweety.herokuapp.com/history?&id=302+30570&cl=
## 1510   http://ntusweety.herokuapp.com/history?&id=302+31530&cl=
## 1511 http://ntusweety.herokuapp.com/history?&id=302+32420&cl=01
## 1512 http://ntusweety.herokuapp.com/history?&id=302+32420&cl=02
## 1513   http://ntusweety.herokuapp.com/history?&id=302+32530&cl=
## 1514   http://ntusweety.herokuapp.com/history?&id=302+33140&cl=
## 1515   http://ntusweety.herokuapp.com/history?&id=302+33610&cl=
## 1516   http://ntusweety.herokuapp.com/history?&id=302+33720&cl=
## 1517   http://ntusweety.herokuapp.com/history?&id=302+34120&cl=
## 1518   http://ntusweety.herokuapp.com/history?&id=302+34200&cl=
## 1519   http://ntusweety.herokuapp.com/history?&id=302+36320&cl=
## 1520   http://ntusweety.herokuapp.com/history?&id=302+38220&cl=
## 1521   http://ntusweety.herokuapp.com/history?&id=302+39200&cl=
## 1522   http://ntusweety.herokuapp.com/history?&id=302+40220&cl=
## 1523   http://ntusweety.herokuapp.com/history?&id=302+40620&cl=
## 1524   http://ntusweety.herokuapp.com/history?&id=302+41700&cl=
## 1525   http://ntusweety.herokuapp.com/history?&id=302+43220&cl=
## 1526   http://ntusweety.herokuapp.com/history?&id=302E45130&cl=
## 1527   http://ntusweety.herokuapp.com/history?&id=302+49210&cl=
## 1528   http://ntusweety.herokuapp.com/history?&id=302+49500&cl=
## 1529   http://ntusweety.herokuapp.com/history?&id=302+49900&cl=
## 1530   http://ntusweety.herokuapp.com/history?&id=302E51700&cl=
## 1531 http://ntusweety.herokuapp.com/history?&id=303+13112&cl=01
## 1532 http://ntusweety.herokuapp.com/history?&id=303+13112&cl=02
## 1533 http://ntusweety.herokuapp.com/history?&id=303+13112&cl=03
## 1534 http://ntusweety.herokuapp.com/history?&id=303+13112&cl=04
## 1535 http://ntusweety.herokuapp.com/history?&id=303E13112&cl=05
## 1536   http://ntusweety.herokuapp.com/history?&id=303+19010&cl=
## 1537   http://ntusweety.herokuapp.com/history?&id=303E20020&cl=
## 1538 http://ntusweety.herokuapp.com/history?&id=303+22020&cl=01
## 1539 http://ntusweety.herokuapp.com/history?&id=303+22020&cl=02
## 1540 http://ntusweety.herokuapp.com/history?&id=303+22020&cl=03
## 1541 http://ntusweety.herokuapp.com/history?&id=303+22020&cl=04
## 1542 http://ntusweety.herokuapp.com/history?&id=303E22020&cl=05
## 1543 http://ntusweety.herokuapp.com/history?&id=303+22120&cl=01
## 1544 http://ntusweety.herokuapp.com/history?&id=303+22120&cl=02
## 1545 http://ntusweety.herokuapp.com/history?&id=303+22120&cl=03
## 1546 http://ntusweety.herokuapp.com/history?&id=303E22120&cl=04
## 1547   http://ntusweety.herokuapp.com/history?&id=303+22130&cl=
## 1548 http://ntusweety.herokuapp.com/history?&id=303+22230&cl=01
## 1549 http://ntusweety.herokuapp.com/history?&id=303+22230&cl=02
## 1550   http://ntusweety.herokuapp.com/history?&id=303+22410&cl=
## 1551   http://ntusweety.herokuapp.com/history?&id=303+28000&cl=
## 1552   http://ntusweety.herokuapp.com/history?&id=303+30120&cl=
## 1553 http://ntusweety.herokuapp.com/history?&id=303+35100&cl=01
## 1554 http://ntusweety.herokuapp.com/history?&id=303+35100&cl=02
## 1555 http://ntusweety.herokuapp.com/history?&id=303+36020&cl=01
## 1556 http://ntusweety.herokuapp.com/history?&id=303+36020&cl=02
## 1557   http://ntusweety.herokuapp.com/history?&id=303+40102&cl=
## 1558   http://ntusweety.herokuapp.com/history?&id=303+45300&cl=
## 1559   http://ntusweety.herokuapp.com/history?&id=303E47300&cl=
## 1560 http://ntusweety.herokuapp.com/history?&id=303+47400&cl=01
## 1561 http://ntusweety.herokuapp.com/history?&id=303E47400&cl=02
## 1562   http://ntusweety.herokuapp.com/history?&id=303+47500&cl=
## 1563   http://ntusweety.herokuapp.com/history?&id=303+48120&cl=
## 1564   http://ntusweety.herokuapp.com/history?&id=303+48300&cl=
## 1565   http://ntusweety.herokuapp.com/history?&id=303+49500&cl=
## 1566   http://ntusweety.herokuapp.com/history?&id=305+101A2&cl=
## 1567 http://ntusweety.herokuapp.com/history?&id=305+101D0&cl=01
## 1568 http://ntusweety.herokuapp.com/history?&id=305+101D0&cl=02
## 1569   http://ntusweety.herokuapp.com/history?&id=305+10240&cl=
## 1570   http://ntusweety.herokuapp.com/history?&id=305+21202&cl=
## 1571   http://ntusweety.herokuapp.com/history?&id=305+23330&cl=
## 1572   http://ntusweety.herokuapp.com/history?&id=305+23340&cl=
## 1573   http://ntusweety.herokuapp.com/history?&id=305+30300&cl=
## 1574   http://ntusweety.herokuapp.com/history?&id=305+30730&cl=
## 1575   http://ntusweety.herokuapp.com/history?&id=305+311A2&cl=
## 1576   http://ntusweety.herokuapp.com/history?&id=305+32100&cl=
## 1577   http://ntusweety.herokuapp.com/history?&id=305+33530&cl=
## 1578   http://ntusweety.herokuapp.com/history?&id=305+40302&cl=
## 1579   http://ntusweety.herokuapp.com/history?&id=305+49520&cl=
## 1580   http://ntusweety.herokuapp.com/history?&id=305+50000&cl=
## 1581   http://ntusweety.herokuapp.com/history?&id=305+62000&cl=
## 1582   http://ntusweety.herokuapp.com/history?&id=305+62020&cl=
## 1583   http://ntusweety.herokuapp.com/history?&id=310+11002&cl=
## 1584   http://ntusweety.herokuapp.com/history?&id=310+12300&cl=
## 1585   http://ntusweety.herokuapp.com/history?&id=310+16000&cl=
## 1586   http://ntusweety.herokuapp.com/history?&id=310+16700&cl=
## 1587   http://ntusweety.herokuapp.com/history?&id=310+21000&cl=
## 1588   http://ntusweety.herokuapp.com/history?&id=310+23100&cl=
## 1589   http://ntusweety.herokuapp.com/history?&id=310+26000&cl=
## 1590   http://ntusweety.herokuapp.com/history?&id=310+32002&cl=
## 1591   http://ntusweety.herokuapp.com/history?&id=310+35000&cl=
## 1592   http://ntusweety.herokuapp.com/history?&id=310+36100&cl=
## 1593   http://ntusweety.herokuapp.com/history?&id=310+36310&cl=
## 1594   http://ntusweety.herokuapp.com/history?&id=310+38000&cl=
## 1595   http://ntusweety.herokuapp.com/history?&id=310+44000&cl=
## 1596 http://ntusweety.herokuapp.com/history?&id=310+48000&cl=01
## 1597   http://ntusweety.herokuapp.com/history?&id=322+D0010&cl=
## 1598   http://ntusweety.herokuapp.com/history?&id=322+D0320&cl=
## 1599   http://ntusweety.herokuapp.com/history?&id=322+D0350&cl=
## 1600   http://ntusweety.herokuapp.com/history?&id=322+D0720&cl=
## 1601   http://ntusweety.herokuapp.com/history?&id=322+D0970&cl=
## 1602   http://ntusweety.herokuapp.com/history?&id=322+D1430&cl=
## 1603   http://ntusweety.herokuapp.com/history?&id=322+M0010&cl=
## 1604   http://ntusweety.herokuapp.com/history?&id=322+M1670&cl=
## 1605   http://ntusweety.herokuapp.com/history?&id=322+M3180&cl=
## 1606 http://ntusweety.herokuapp.com/history?&id=322+M3180&cl=02
## 1607 http://ntusweety.herokuapp.com/history?&id=322+M3340&cl=02
## 1608   http://ntusweety.herokuapp.com/history?&id=322+M3900&cl=
## 1609   http://ntusweety.herokuapp.com/history?&id=322+M3950&cl=
## 1610   http://ntusweety.herokuapp.com/history?&id=322+M4020&cl=
## 1611   http://ntusweety.herokuapp.com/history?&id=322+M4040&cl=
## 1612   http://ntusweety.herokuapp.com/history?&id=322+M4050&cl=
## 1613   http://ntusweety.herokuapp.com/history?&id=322+M4080&cl=
## 1614   http://ntusweety.herokuapp.com/history?&id=322+M4250&cl=
## 1615   http://ntusweety.herokuapp.com/history?&id=322+M4290&cl=
## 1616   http://ntusweety.herokuapp.com/history?&id=322+M4560&cl=
## 1617   http://ntusweety.herokuapp.com/history?&id=322+M4590&cl=
## 1618   http://ntusweety.herokuapp.com/history?&id=322+M4880&cl=
## 1619 http://ntusweety.herokuapp.com/history?&id=322+M4920&cl=01
## 1620 http://ntusweety.herokuapp.com/history?&id=322+M4920&cl=02
## 1621   http://ntusweety.herokuapp.com/history?&id=322+M4930&cl=
## 1622   http://ntusweety.herokuapp.com/history?&id=322+M4980&cl=
## 1623   http://ntusweety.herokuapp.com/history?&id=322+M5040&cl=
## 1624   http://ntusweety.herokuapp.com/history?&id=322+M5090&cl=
## 1625   http://ntusweety.herokuapp.com/history?&id=322+M5100&cl=
## 1626   http://ntusweety.herokuapp.com/history?&id=322+M5120&cl=
## 1627   http://ntusweety.herokuapp.com/history?&id=322+M5220&cl=
## 1628   http://ntusweety.herokuapp.com/history?&id=322EM5230&cl=
## 1629   http://ntusweety.herokuapp.com/history?&id=322+U0640&cl=
## 1630   http://ntusweety.herokuapp.com/history?&id=322+U1430&cl=
## 1631   http://ntusweety.herokuapp.com/history?&id=322+U1440&cl=
## 1632   http://ntusweety.herokuapp.com/history?&id=322+U1450&cl=
## 1633   http://ntusweety.herokuapp.com/history?&id=322+U1840&cl=
## 1634   http://ntusweety.herokuapp.com/history?&id=322+U1870&cl=
## 1635   http://ntusweety.herokuapp.com/history?&id=323+D0010&cl=
## 1636   http://ntusweety.herokuapp.com/history?&id=323+M0010&cl=
## 1637   http://ntusweety.herokuapp.com/history?&id=323+M0020&cl=
## 1638   http://ntusweety.herokuapp.com/history?&id=323+M0230&cl=
## 1639   http://ntusweety.herokuapp.com/history?&id=323+M0250&cl=
## 1640   http://ntusweety.herokuapp.com/history?&id=323+M0630&cl=
## 1641   http://ntusweety.herokuapp.com/history?&id=323EM0640&cl=
## 1642   http://ntusweety.herokuapp.com/history?&id=323+M1150&cl=
## 1643   http://ntusweety.herokuapp.com/history?&id=323+M1160&cl=
## 1644   http://ntusweety.herokuapp.com/history?&id=323+M1380&cl=
## 1645   http://ntusweety.herokuapp.com/history?&id=323+M2360&cl=
## 1646   http://ntusweety.herokuapp.com/history?&id=323+M2460&cl=
## 1647   http://ntusweety.herokuapp.com/history?&id=323EM3210&cl=
## 1648   http://ntusweety.herokuapp.com/history?&id=323EM4150&cl=
## 1649   http://ntusweety.herokuapp.com/history?&id=323+M6540&cl=
## 1650   http://ntusweety.herokuapp.com/history?&id=323+M7120&cl=
## 1651   http://ntusweety.herokuapp.com/history?&id=323+M7220&cl=
## 1652   http://ntusweety.herokuapp.com/history?&id=323+M7320&cl=
## 1653   http://ntusweety.herokuapp.com/history?&id=323+M7360&cl=
## 1654   http://ntusweety.herokuapp.com/history?&id=323+M7470&cl=
## 1655   http://ntusweety.herokuapp.com/history?&id=323+M7490&cl=
## 1656   http://ntusweety.herokuapp.com/history?&id=323+M7540&cl=
## 1657   http://ntusweety.herokuapp.com/history?&id=323EU0200&cl=
## 1658   http://ntusweety.herokuapp.com/history?&id=323+U0260&cl=
## 1659   http://ntusweety.herokuapp.com/history?&id=323+U0320&cl=
## 1660   http://ntusweety.herokuapp.com/history?&id=323+U0600&cl=
## 1661   http://ntusweety.herokuapp.com/history?&id=323+U1960&cl=
## 1662   http://ntusweety.herokuapp.com/history?&id=323+U2630&cl=
## 1663   http://ntusweety.herokuapp.com/history?&id=323+U3610&cl=
## 1664   http://ntusweety.herokuapp.com/history?&id=323+U8100&cl=
## 1665   http://ntusweety.herokuapp.com/history?&id=325+D0010&cl=
## 1666   http://ntusweety.herokuapp.com/history?&id=325+M0010&cl=
## 1667   http://ntusweety.herokuapp.com/history?&id=325+M0260&cl=
## 1668   http://ntusweety.herokuapp.com/history?&id=325+M0380&cl=
## 1669   http://ntusweety.herokuapp.com/history?&id=325+M2790&cl=
## 1670   http://ntusweety.herokuapp.com/history?&id=325+M4200&cl=
## 1671   http://ntusweety.herokuapp.com/history?&id=325+M6500&cl=
## 1672   http://ntusweety.herokuapp.com/history?&id=325+M7570&cl=
## 1673   http://ntusweety.herokuapp.com/history?&id=325+M7660&cl=
## 1674   http://ntusweety.herokuapp.com/history?&id=325+M9990&cl=
## 1675   http://ntusweety.herokuapp.com/history?&id=325+U5310&cl=
## 1676   http://ntusweety.herokuapp.com/history?&id=330+D0010&cl=
## 1677   http://ntusweety.herokuapp.com/history?&id=330+M0010&cl=
## 1678 http://ntusweety.herokuapp.com/history?&id=330+M1020&cl=01
## 1679 http://ntusweety.herokuapp.com/history?&id=330+M1020&cl=02
## 1680   http://ntusweety.herokuapp.com/history?&id=330+M1100&cl=
## 1681   http://ntusweety.herokuapp.com/history?&id=330+M1200&cl=
## 1682   http://ntusweety.herokuapp.com/history?&id=330+M1700&cl=
## 1683   http://ntusweety.herokuapp.com/history?&id=330+M2100&cl=
## 1684   http://ntusweety.herokuapp.com/history?&id=330+U1020&cl=
## 1685   http://ntusweety.herokuapp.com/history?&id=330+U1300&cl=
## 1686   http://ntusweety.herokuapp.com/history?&id=330+U1600&cl=
## 1687   http://ntusweety.herokuapp.com/history?&id=341+10800&cl=
## 1688   http://ntusweety.herokuapp.com/history?&id=341+10900&cl=
## 1689   http://ntusweety.herokuapp.com/history?&id=341+11440&cl=
## 1690   http://ntusweety.herokuapp.com/history?&id=341+11460&cl=
## 1691   http://ntusweety.herokuapp.com/history?&id=341+11470&cl=
## 1692   http://ntusweety.herokuapp.com/history?&id=341+11520&cl=
## 1693   http://ntusweety.herokuapp.com/history?&id=341+11640&cl=
## 1694   http://ntusweety.herokuapp.com/history?&id=341+17880&cl=
## 1695   http://ntusweety.herokuapp.com/history?&id=341+17920&cl=
## 1696   http://ntusweety.herokuapp.com/history?&id=341+D0010&cl=
## 1697   http://ntusweety.herokuapp.com/history?&id=341+D1210&cl=
## 1698   http://ntusweety.herokuapp.com/history?&id=341+D1420&cl=
## 1699   http://ntusweety.herokuapp.com/history?&id=341+D1510&cl=
## 1700   http://ntusweety.herokuapp.com/history?&id=341+D1550&cl=
## 1701   http://ntusweety.herokuapp.com/history?&id=341+D1590&cl=
## 1702   http://ntusweety.herokuapp.com/history?&id=341+M0010&cl=
## 1703   http://ntusweety.herokuapp.com/history?&id=341+M1100&cl=
## 1704   http://ntusweety.herokuapp.com/history?&id=341+M5030&cl=
## 1705 http://ntusweety.herokuapp.com/history?&id=341+M5110&cl=01
## 1706 http://ntusweety.herokuapp.com/history?&id=341+M5110&cl=02
## 1707   http://ntusweety.herokuapp.com/history?&id=341+M5140&cl=
## 1708   http://ntusweety.herokuapp.com/history?&id=341+M5190&cl=
## 1709   http://ntusweety.herokuapp.com/history?&id=341+M5210&cl=
## 1710   http://ntusweety.herokuapp.com/history?&id=341+M5220&cl=
## 1711   http://ntusweety.herokuapp.com/history?&id=341+M5270&cl=
## 1712   http://ntusweety.herokuapp.com/history?&id=341+M5280&cl=
## 1713   http://ntusweety.herokuapp.com/history?&id=341+M5310&cl=
## 1714   http://ntusweety.herokuapp.com/history?&id=341+M5350&cl=
## 1715   http://ntusweety.herokuapp.com/history?&id=341+M5380&cl=
## 1716   http://ntusweety.herokuapp.com/history?&id=341+U7350&cl=
## 1717   http://ntusweety.herokuapp.com/history?&id=341+U7530&cl=
## 1718   http://ntusweety.herokuapp.com/history?&id=341+U8080&cl=
## 1719   http://ntusweety.herokuapp.com/history?&id=341+U8150&cl=
## 1720   http://ntusweety.herokuapp.com/history?&id=341+U8160&cl=
## 1721   http://ntusweety.herokuapp.com/history?&id=341EU8260&cl=
## 1722   http://ntusweety.herokuapp.com/history?&id=341+U8660&cl=
## 1723   http://ntusweety.herokuapp.com/history?&id=341+U8670&cl=
## 1724   http://ntusweety.herokuapp.com/history?&id=341+U8690&cl=
## 1725   http://ntusweety.herokuapp.com/history?&id=341+U8960&cl=
## 1726   http://ntusweety.herokuapp.com/history?&id=341+U8980&cl=
## 1727   http://ntusweety.herokuapp.com/history?&id=341+U9070&cl=
## 1728   http://ntusweety.herokuapp.com/history?&id=341+U9090&cl=
## 1729   http://ntusweety.herokuapp.com/history?&id=341+U9190&cl=
## 1730   http://ntusweety.herokuapp.com/history?&id=341+U9220&cl=
## 1731   http://ntusweety.herokuapp.com/history?&id=341+U9270&cl=
## 1732   http://ntusweety.herokuapp.com/history?&id=341EU9280&cl=
## 1733   http://ntusweety.herokuapp.com/history?&id=342+M0010&cl=
## 1734 http://ntusweety.herokuapp.com/history?&id=342+M1380&cl=01
## 1735 http://ntusweety.herokuapp.com/history?&id=342+M1380&cl=02
## 1736   http://ntusweety.herokuapp.com/history?&id=342+M2140&cl=
## 1737   http://ntusweety.herokuapp.com/history?&id=342+M2150&cl=
## 1738   http://ntusweety.herokuapp.com/history?&id=342EM2290&cl=
## 1739   http://ntusweety.herokuapp.com/history?&id=342+M2510&cl=
## 1740   http://ntusweety.herokuapp.com/history?&id=342+M2690&cl=
## 1741   http://ntusweety.herokuapp.com/history?&id=342+M2720&cl=
## 1742   http://ntusweety.herokuapp.com/history?&id=342+M2730&cl=
## 1743   http://ntusweety.herokuapp.com/history?&id=342+M2920&cl=
## 1744 http://ntusweety.herokuapp.com/history?&id=342+M2950&cl=01
## 1745 http://ntusweety.herokuapp.com/history?&id=342+M2950&cl=02
## 1746   http://ntusweety.herokuapp.com/history?&id=342+M2970&cl=
## 1747   http://ntusweety.herokuapp.com/history?&id=342+U1210&cl=
## 1748   http://ntusweety.herokuapp.com/history?&id=401+211B0&cl=
## 1749   http://ntusweety.herokuapp.com/history?&id=401+212B0&cl=
## 1750   http://ntusweety.herokuapp.com/history?&id=401+24312&cl=
## 1751   http://ntusweety.herokuapp.com/history?&id=401+244C0&cl=
## 1752   http://ntusweety.herokuapp.com/history?&id=401+245C0&cl=
## 1753   http://ntusweety.herokuapp.com/history?&id=401+27230&cl=
## 1754   http://ntusweety.herokuapp.com/history?&id=401+28100&cl=
## 1755   http://ntusweety.herokuapp.com/history?&id=401+28200&cl=
## 1756   http://ntusweety.herokuapp.com/history?&id=401+29250&cl=
## 1757   http://ntusweety.herokuapp.com/history?&id=401+29270&cl=
## 1758   http://ntusweety.herokuapp.com/history?&id=401+30432&cl=
## 1759   http://ntusweety.herokuapp.com/history?&id=401+30502&cl=
## 1760   http://ntusweety.herokuapp.com/history?&id=401+30820&cl=
## 1761   http://ntusweety.herokuapp.com/history?&id=401+30830&cl=
## 1762   http://ntusweety.herokuapp.com/history?&id=401+31302&cl=
## 1763   http://ntusweety.herokuapp.com/history?&id=401+32200&cl=
## 1764   http://ntusweety.herokuapp.com/history?&id=401+32302&cl=
## 1765 http://ntusweety.herokuapp.com/history?&id=401+32700&cl=01
## 1766 http://ntusweety.herokuapp.com/history?&id=401+32700&cl=04
## 1767   http://ntusweety.herokuapp.com/history?&id=401+33310&cl=
## 1768   http://ntusweety.herokuapp.com/history?&id=401+335B0&cl=
## 1769   http://ntusweety.herokuapp.com/history?&id=401+349C0&cl=
## 1770   http://ntusweety.herokuapp.com/history?&id=401+352B0&cl=
## 1771   http://ntusweety.herokuapp.com/history?&id=401+352C0&cl=
## 1772   http://ntusweety.herokuapp.com/history?&id=401+35320&cl=
## 1773 http://ntusweety.herokuapp.com/history?&id=401+356B0&cl=01
## 1774   http://ntusweety.herokuapp.com/history?&id=401+35700&cl=
## 1775 http://ntusweety.herokuapp.com/history?&id=401+357C0&cl=01
## 1776   http://ntusweety.herokuapp.com/history?&id=401+38600&cl=
## 1777   http://ntusweety.herokuapp.com/history?&id=401+40212&cl=
## 1778   http://ntusweety.herokuapp.com/history?&id=401+40312&cl=
## 1779   http://ntusweety.herokuapp.com/history?&id=401+40622&cl=
## 1780   http://ntusweety.herokuapp.com/history?&id=401+40810&cl=
## 1781   http://ntusweety.herokuapp.com/history?&id=401+40922&cl=
## 1782   http://ntusweety.herokuapp.com/history?&id=401+43110&cl=
## 1783   http://ntusweety.herokuapp.com/history?&id=401+44112&cl=
## 1784   http://ntusweety.herokuapp.com/history?&id=401+44200&cl=
## 1785   http://ntusweety.herokuapp.com/history?&id=401+49700&cl=
## 1786 http://ntusweety.herokuapp.com/history?&id=401+50040&cl=01
## 1787 http://ntusweety.herokuapp.com/history?&id=401+50080&cl=01
## 1788   http://ntusweety.herokuapp.com/history?&id=401+50100&cl=
## 1789   http://ntusweety.herokuapp.com/history?&id=401+51140&cl=
## 1790   http://ntusweety.herokuapp.com/history?&id=401+55300&cl=
## 1791 http://ntusweety.herokuapp.com/history?&id=401+57112&cl=01
## 1792   http://ntusweety.herokuapp.com/history?&id=401+57120&cl=
## 1793   http://ntusweety.herokuapp.com/history?&id=401+57310&cl=
## 1794   http://ntusweety.herokuapp.com/history?&id=401+58220&cl=
## 1795   http://ntusweety.herokuapp.com/history?&id=401+60000&cl=
## 1796   http://ntusweety.herokuapp.com/history?&id=401+605A0&cl=
## 1797 http://ntusweety.herokuapp.com/history?&id=401E605A0&cl=02
## 1798 http://ntusweety.herokuapp.com/history?&id=401E605B0&cl=02
## 1799   http://ntusweety.herokuapp.com/history?&id=401+615A0&cl=
## 1800 http://ntusweety.herokuapp.com/history?&id=401E615A0&cl=02
## 1801 http://ntusweety.herokuapp.com/history?&id=401E615B0&cl=02
## 1802   http://ntusweety.herokuapp.com/history?&id=401+62000&cl=
## 1803 http://ntusweety.herokuapp.com/history?&id=401E62000&cl=02
## 1804 http://ntusweety.herokuapp.com/history?&id=401+63110&cl=01
## 1805   http://ntusweety.herokuapp.com/history?&id=401+63400&cl=
## 1806 http://ntusweety.herokuapp.com/history?&id=401+63400&cl=02
## 1807   http://ntusweety.herokuapp.com/history?&id=401+63800&cl=
## 1808 http://ntusweety.herokuapp.com/history?&id=401E63800&cl=02
## 1809   http://ntusweety.herokuapp.com/history?&id=401+65300&cl=
## 1810 http://ntusweety.herokuapp.com/history?&id=401E65300&cl=02
## 1811   http://ntusweety.herokuapp.com/history?&id=401+66400&cl=
## 1812 http://ntusweety.herokuapp.com/history?&id=401+66400&cl=02
## 1813   http://ntusweety.herokuapp.com/history?&id=401+66700&cl=
## 1814 http://ntusweety.herokuapp.com/history?&id=401+66700&cl=02
## 1815 http://ntusweety.herokuapp.com/history?&id=401+66710&cl=01
## 1816 http://ntusweety.herokuapp.com/history?&id=401+66910&cl=01
## 1817 http://ntusweety.herokuapp.com/history?&id=401+67900&cl=02
## 1818   http://ntusweety.herokuapp.com/history?&id=401+68000&cl=
## 1819   http://ntusweety.herokuapp.com/history?&id=401+68800&cl=
## 1820 http://ntusweety.herokuapp.com/history?&id=401E68800&cl=02
## 1821   http://ntusweety.herokuapp.com/history?&id=401+68900&cl=
## 1822 http://ntusweety.herokuapp.com/history?&id=401E68900&cl=02
## 1823 http://ntusweety.herokuapp.com/history?&id=401+69010&cl=01
## 1824   http://ntusweety.herokuapp.com/history?&id=401+69400&cl=
## 1825 http://ntusweety.herokuapp.com/history?&id=401E69400&cl=02
## 1826   http://ntusweety.herokuapp.com/history?&id=401+69500&cl=
## 1827 http://ntusweety.herokuapp.com/history?&id=401E69500&cl=02
## 1828   http://ntusweety.herokuapp.com/history?&id=401+69660&cl=
## 1829   http://ntusweety.herokuapp.com/history?&id=401E699A0&cl=
## 1830 http://ntusweety.herokuapp.com/history?&id=401E699A0&cl=02
## 1831 http://ntusweety.herokuapp.com/history?&id=401E699B0&cl=02
## 1832   http://ntusweety.herokuapp.com/history?&id=401+70100&cl=
## 1833   http://ntusweety.herokuapp.com/history?&id=401+71100&cl=
## 1834   http://ntusweety.herokuapp.com/history?&id=401+713C0&cl=
## 1835   http://ntusweety.herokuapp.com/history?&id=401+724C0&cl=
## 1836   http://ntusweety.herokuapp.com/history?&id=401E725C0&cl=
## 1837   http://ntusweety.herokuapp.com/history?&id=401+732B0&cl=
## 1838   http://ntusweety.herokuapp.com/history?&id=401+742C0&cl=
## 1839   http://ntusweety.herokuapp.com/history?&id=401+745C0&cl=
## 1840   http://ntusweety.herokuapp.com/history?&id=401+750C0&cl=
## 1841   http://ntusweety.herokuapp.com/history?&id=401+764C0&cl=
## 1842   http://ntusweety.herokuapp.com/history?&id=401+774C0&cl=
## 1843   http://ntusweety.herokuapp.com/history?&id=401+780C0&cl=
## 1844   http://ntusweety.herokuapp.com/history?&id=401+782B0&cl=
## 1845   http://ntusweety.herokuapp.com/history?&id=401+794C0&cl=
## 1846   http://ntusweety.herokuapp.com/history?&id=401+795C0&cl=
## 1847   http://ntusweety.herokuapp.com/history?&id=401+798C0&cl=
## 1848   http://ntusweety.herokuapp.com/history?&id=401+799C0&cl=
## 1849   http://ntusweety.herokuapp.com/history?&id=401+90030&cl=
## 1850   http://ntusweety.herokuapp.com/history?&id=402+13000&cl=
## 1851   http://ntusweety.herokuapp.com/history?&id=402+22010&cl=
## 1852   http://ntusweety.herokuapp.com/history?&id=402+30700&cl=
## 1853   http://ntusweety.herokuapp.com/history?&id=402+30900&cl=
## 1854   http://ntusweety.herokuapp.com/history?&id=402+31510&cl=
## 1855   http://ntusweety.herokuapp.com/history?&id=402+40900&cl=
## 1856   http://ntusweety.herokuapp.com/history?&id=402+41500&cl=
## 1857   http://ntusweety.herokuapp.com/history?&id=402+41600&cl=
## 1858   http://ntusweety.herokuapp.com/history?&id=402+41700&cl=
## 1859   http://ntusweety.herokuapp.com/history?&id=402+42010&cl=
## 1860   http://ntusweety.herokuapp.com/history?&id=402+42200&cl=
## 1861   http://ntusweety.herokuapp.com/history?&id=402+42510&cl=
## 1862   http://ntusweety.herokuapp.com/history?&id=402+42600&cl=
## 1863   http://ntusweety.herokuapp.com/history?&id=402+42800&cl=
## 1864   http://ntusweety.herokuapp.com/history?&id=402+47100&cl=
## 1865   http://ntusweety.herokuapp.com/history?&id=402+48200&cl=
## 1866   http://ntusweety.herokuapp.com/history?&id=402+53900&cl=
## 1867   http://ntusweety.herokuapp.com/history?&id=402+54000&cl=
## 1868   http://ntusweety.herokuapp.com/history?&id=402+54330&cl=
## 1869   http://ntusweety.herokuapp.com/history?&id=402+55100&cl=
## 1870   http://ntusweety.herokuapp.com/history?&id=402+55500&cl=
## 1871   http://ntusweety.herokuapp.com/history?&id=402+58100&cl=
## 1872   http://ntusweety.herokuapp.com/history?&id=402+59300&cl=
## 1873   http://ntusweety.herokuapp.com/history?&id=402+59400&cl=
## 1874   http://ntusweety.herokuapp.com/history?&id=402+59500&cl=
## 1875   http://ntusweety.herokuapp.com/history?&id=402+59600&cl=
## 1876   http://ntusweety.herokuapp.com/history?&id=402+59700&cl=
## 1877   http://ntusweety.herokuapp.com/history?&id=402+59802&cl=
## 1878   http://ntusweety.herokuapp.com/history?&id=402+61202&cl=
## 1879   http://ntusweety.herokuapp.com/history?&id=402+61502&cl=
## 1880   http://ntusweety.herokuapp.com/history?&id=402+62000&cl=
## 1881   http://ntusweety.herokuapp.com/history?&id=402+62400&cl=
## 1882   http://ntusweety.herokuapp.com/history?&id=402+62600&cl=
## 1883   http://ntusweety.herokuapp.com/history?&id=402+63100&cl=
## 1884   http://ntusweety.herokuapp.com/history?&id=402+63500&cl=
## 1885   http://ntusweety.herokuapp.com/history?&id=402+63800&cl=
## 1886   http://ntusweety.herokuapp.com/history?&id=402+64300&cl=
## 1887   http://ntusweety.herokuapp.com/history?&id=402+65100&cl=
## 1888   http://ntusweety.herokuapp.com/history?&id=402+66100&cl=
## 1889   http://ntusweety.herokuapp.com/history?&id=402+68302&cl=
## 1890   http://ntusweety.herokuapp.com/history?&id=403+20110&cl=
## 1891   http://ntusweety.herokuapp.com/history?&id=403+20120&cl=
## 1892   http://ntusweety.herokuapp.com/history?&id=403+20310&cl=
## 1893   http://ntusweety.herokuapp.com/history?&id=403+22300&cl=
## 1894   http://ntusweety.herokuapp.com/history?&id=403+30020&cl=
## 1895   http://ntusweety.herokuapp.com/history?&id=403+30100&cl=
## 1896   http://ntusweety.herokuapp.com/history?&id=403+33402&cl=
## 1897   http://ntusweety.herokuapp.com/history?&id=403+34300&cl=
## 1898   http://ntusweety.herokuapp.com/history?&id=403+36400&cl=
## 1899   http://ntusweety.herokuapp.com/history?&id=403+41800&cl=
## 1900   http://ntusweety.herokuapp.com/history?&id=403+46400&cl=
## 1901   http://ntusweety.herokuapp.com/history?&id=403+47010&cl=
## 1902   http://ntusweety.herokuapp.com/history?&id=403+47020&cl=
## 1903   http://ntusweety.herokuapp.com/history?&id=403+47030&cl=
## 1904   http://ntusweety.herokuapp.com/history?&id=403+47040&cl=
## 1905   http://ntusweety.herokuapp.com/history?&id=403+47050&cl=
## 1906   http://ntusweety.herokuapp.com/history?&id=403+47060&cl=
## 1907   http://ntusweety.herokuapp.com/history?&id=403+47070&cl=
## 1908   http://ntusweety.herokuapp.com/history?&id=403+47080&cl=
## 1909   http://ntusweety.herokuapp.com/history?&id=403+47090&cl=
## 1910   http://ntusweety.herokuapp.com/history?&id=403+47100&cl=
## 1911   http://ntusweety.herokuapp.com/history?&id=403+49230&cl=
## 1912   http://ntusweety.herokuapp.com/history?&id=404+10200&cl=
## 1913   http://ntusweety.herokuapp.com/history?&id=404+10300&cl=
## 1914   http://ntusweety.herokuapp.com/history?&id=404+10310&cl=
## 1915   http://ntusweety.herokuapp.com/history?&id=404+10320&cl=
## 1916   http://ntusweety.herokuapp.com/history?&id=404+10330&cl=
## 1917   http://ntusweety.herokuapp.com/history?&id=404+31300&cl=
## 1918   http://ntusweety.herokuapp.com/history?&id=404+31400&cl=
## 1919   http://ntusweety.herokuapp.com/history?&id=404+36362&cl=
## 1920   http://ntusweety.herokuapp.com/history?&id=404+36432&cl=
## 1921   http://ntusweety.herokuapp.com/history?&id=404+38410&cl=
## 1922   http://ntusweety.herokuapp.com/history?&id=404+40200&cl=
## 1923   http://ntusweety.herokuapp.com/history?&id=404+44710&cl=
## 1924   http://ntusweety.herokuapp.com/history?&id=404+44920&cl=
## 1925   http://ntusweety.herokuapp.com/history?&id=404+44930&cl=
## 1926   http://ntusweety.herokuapp.com/history?&id=404+45300&cl=
## 1927   http://ntusweety.herokuapp.com/history?&id=404+46600&cl=
## 1928   http://ntusweety.herokuapp.com/history?&id=404+47500&cl=
## 1929   http://ntusweety.herokuapp.com/history?&id=405+50200&cl=
## 1930   http://ntusweety.herokuapp.com/history?&id=405+50500&cl=
## 1931 http://ntusweety.herokuapp.com/history?&id=405+50900&cl=02
## 1932 http://ntusweety.herokuapp.com/history?&id=405+50900&cl=03
## 1933   http://ntusweety.herokuapp.com/history?&id=405+51400&cl=
## 1934   http://ntusweety.herokuapp.com/history?&id=405+52400&cl=
## 1935   http://ntusweety.herokuapp.com/history?&id=405+52700&cl=
## 1936   http://ntusweety.herokuapp.com/history?&id=406+20100&cl=
## 1937   http://ntusweety.herokuapp.com/history?&id=406+20200&cl=
## 1938   http://ntusweety.herokuapp.com/history?&id=406+22300&cl=
## 1939   http://ntusweety.herokuapp.com/history?&id=406+30450&cl=
## 1940   http://ntusweety.herokuapp.com/history?&id=406+30460&cl=
## 1941   http://ntusweety.herokuapp.com/history?&id=406+31010&cl=
## 1942   http://ntusweety.herokuapp.com/history?&id=406+31020&cl=
## 1943   http://ntusweety.herokuapp.com/history?&id=406+31210&cl=
## 1944   http://ntusweety.herokuapp.com/history?&id=406+31220&cl=
## 1945   http://ntusweety.herokuapp.com/history?&id=406+40700&cl=
## 1946   http://ntusweety.herokuapp.com/history?&id=406+41310&cl=
## 1947   http://ntusweety.herokuapp.com/history?&id=406+41410&cl=
## 1948   http://ntusweety.herokuapp.com/history?&id=406+41620&cl=
## 1949   http://ntusweety.herokuapp.com/history?&id=406+41900&cl=
## 1950   http://ntusweety.herokuapp.com/history?&id=406+41910&cl=
## 1951   http://ntusweety.herokuapp.com/history?&id=406+42000&cl=
## 1952   http://ntusweety.herokuapp.com/history?&id=406+42010&cl=
## 1953   http://ntusweety.herokuapp.com/history?&id=408+21100&cl=
## 1954   http://ntusweety.herokuapp.com/history?&id=408+21200&cl=
## 1955   http://ntusweety.herokuapp.com/history?&id=408+21400&cl=
## 1956   http://ntusweety.herokuapp.com/history?&id=408+21500&cl=
## 1957   http://ntusweety.herokuapp.com/history?&id=408+21700&cl=
## 1958   http://ntusweety.herokuapp.com/history?&id=408+22300&cl=
## 1959   http://ntusweety.herokuapp.com/history?&id=408+22310&cl=
## 1960   http://ntusweety.herokuapp.com/history?&id=408+22320&cl=
## 1961   http://ntusweety.herokuapp.com/history?&id=408+22600&cl=
## 1962   http://ntusweety.herokuapp.com/history?&id=408+22610&cl=
## 1963   http://ntusweety.herokuapp.com/history?&id=408+22700&cl=
## 1964   http://ntusweety.herokuapp.com/history?&id=408+22710&cl=
## 1965   http://ntusweety.herokuapp.com/history?&id=408+22800&cl=
## 1966   http://ntusweety.herokuapp.com/history?&id=408+31040&cl=
## 1967   http://ntusweety.herokuapp.com/history?&id=408+31700&cl=
## 1968   http://ntusweety.herokuapp.com/history?&id=408+32100&cl=
## 1969   http://ntusweety.herokuapp.com/history?&id=408+32500&cl=
## 1970   http://ntusweety.herokuapp.com/history?&id=408+32510&cl=
## 1971 http://ntusweety.herokuapp.com/history?&id=408+32700&cl=01
## 1972 http://ntusweety.herokuapp.com/history?&id=408+32700&cl=02
## 1973   http://ntusweety.herokuapp.com/history?&id=408+32810&cl=
## 1974   http://ntusweety.herokuapp.com/history?&id=408+32910&cl=
## 1975   http://ntusweety.herokuapp.com/history?&id=408+33010&cl=
## 1976   http://ntusweety.herokuapp.com/history?&id=408+33110&cl=
## 1977   http://ntusweety.herokuapp.com/history?&id=408+40010&cl=
## 1978   http://ntusweety.herokuapp.com/history?&id=408+40020&cl=
## 1979   http://ntusweety.herokuapp.com/history?&id=408+40030&cl=
## 1980   http://ntusweety.herokuapp.com/history?&id=408+40040&cl=
## 1981   http://ntusweety.herokuapp.com/history?&id=408+40050&cl=
## 1982   http://ntusweety.herokuapp.com/history?&id=408+40060&cl=
## 1983   http://ntusweety.herokuapp.com/history?&id=408+40070&cl=
## 1984   http://ntusweety.herokuapp.com/history?&id=408+42300&cl=
## 1985   http://ntusweety.herokuapp.com/history?&id=408+42900&cl=
## 1986   http://ntusweety.herokuapp.com/history?&id=409+20100&cl=
## 1987   http://ntusweety.herokuapp.com/history?&id=409+20200&cl=
## 1988   http://ntusweety.herokuapp.com/history?&id=409+20210&cl=
## 1989   http://ntusweety.herokuapp.com/history?&id=409+20300&cl=
## 1990   http://ntusweety.herokuapp.com/history?&id=409+30400&cl=
## 1991   http://ntusweety.herokuapp.com/history?&id=409+30410&cl=
## 1992   http://ntusweety.herokuapp.com/history?&id=409+30500&cl=
## 1993   http://ntusweety.herokuapp.com/history?&id=409+30800&cl=
## 1994   http://ntusweety.herokuapp.com/history?&id=409+30810&cl=
## 1995   http://ntusweety.herokuapp.com/history?&id=409+31010&cl=
## 1996   http://ntusweety.herokuapp.com/history?&id=409+32010&cl=
## 1997   http://ntusweety.herokuapp.com/history?&id=409+36910&cl=
## 1998   http://ntusweety.herokuapp.com/history?&id=409+37010&cl=
## 1999   http://ntusweety.herokuapp.com/history?&id=409+37310&cl=
## 2000   http://ntusweety.herokuapp.com/history?&id=409+37410&cl=
## 2001   http://ntusweety.herokuapp.com/history?&id=409+38300&cl=
## 2002   http://ntusweety.herokuapp.com/history?&id=409+40200&cl=
## 2003   http://ntusweety.herokuapp.com/history?&id=409+40300&cl=
## 2004   http://ntusweety.herokuapp.com/history?&id=409+40400&cl=
## 2005   http://ntusweety.herokuapp.com/history?&id=409+40500&cl=
## 2006   http://ntusweety.herokuapp.com/history?&id=409+40600&cl=
## 2007   http://ntusweety.herokuapp.com/history?&id=409+40700&cl=
## 2008   http://ntusweety.herokuapp.com/history?&id=409+40800&cl=
## 2009   http://ntusweety.herokuapp.com/history?&id=409+40900&cl=
## 2010   http://ntusweety.herokuapp.com/history?&id=420+U1610&cl=
## 2011   http://ntusweety.herokuapp.com/history?&id=420+U2100&cl=
## 2012   http://ntusweety.herokuapp.com/history?&id=420+U2300&cl=
## 2013   http://ntusweety.herokuapp.com/history?&id=420+U3010&cl=
## 2014   http://ntusweety.herokuapp.com/history?&id=420+U3710&cl=
## 2015   http://ntusweety.herokuapp.com/history?&id=420+U4100&cl=
## 2016   http://ntusweety.herokuapp.com/history?&id=420+U4400&cl=
## 2017   http://ntusweety.herokuapp.com/history?&id=420+U4700&cl=
## 2018   http://ntusweety.herokuapp.com/history?&id=421+D0010&cl=
## 2019   http://ntusweety.herokuapp.com/history?&id=421+D0100&cl=
## 2020   http://ntusweety.herokuapp.com/history?&id=421+D9250&cl=
## 2021   http://ntusweety.herokuapp.com/history?&id=421+D9330&cl=
## 2022   http://ntusweety.herokuapp.com/history?&id=421+D9350&cl=
## 2023   http://ntusweety.herokuapp.com/history?&id=421+M0010&cl=
## 2024   http://ntusweety.herokuapp.com/history?&id=421+M0110&cl=
## 2025   http://ntusweety.herokuapp.com/history?&id=421+M1010&cl=
## 2026   http://ntusweety.herokuapp.com/history?&id=421+M1110&cl=
## 2027   http://ntusweety.herokuapp.com/history?&id=421+M1210&cl=
## 2028   http://ntusweety.herokuapp.com/history?&id=421+M1310&cl=
## 2029   http://ntusweety.herokuapp.com/history?&id=421+M1410&cl=
## 2030   http://ntusweety.herokuapp.com/history?&id=421+M1510&cl=
## 2031   http://ntusweety.herokuapp.com/history?&id=421+M1610&cl=
## 2032   http://ntusweety.herokuapp.com/history?&id=421+M1710&cl=
## 2033   http://ntusweety.herokuapp.com/history?&id=421+M1910&cl=
## 2034   http://ntusweety.herokuapp.com/history?&id=421+M2010&cl=
## 2035   http://ntusweety.herokuapp.com/history?&id=421+M2110&cl=
## 2036   http://ntusweety.herokuapp.com/history?&id=421+M2210&cl=
## 2037   http://ntusweety.herokuapp.com/history?&id=421+M3000&cl=
## 2038   http://ntusweety.herokuapp.com/history?&id=421+M3200&cl=
## 2039   http://ntusweety.herokuapp.com/history?&id=421EM9290&cl=
## 2040   http://ntusweety.herokuapp.com/history?&id=421+U0500&cl=
## 2041   http://ntusweety.herokuapp.com/history?&id=421+U3700&cl=
## 2042   http://ntusweety.herokuapp.com/history?&id=421+U6000&cl=
## 2043   http://ntusweety.herokuapp.com/history?&id=422+D0010&cl=
## 2044   http://ntusweety.herokuapp.com/history?&id=422+D0030&cl=
## 2045   http://ntusweety.herokuapp.com/history?&id=422+D1020&cl=
## 2046   http://ntusweety.herokuapp.com/history?&id=422+D1040&cl=
## 2047   http://ntusweety.herokuapp.com/history?&id=422+D1220&cl=
## 2048   http://ntusweety.herokuapp.com/history?&id=422+D1320&cl=
## 2049   http://ntusweety.herokuapp.com/history?&id=422+D6210&cl=
## 2050   http://ntusweety.herokuapp.com/history?&id=422+M0010&cl=
## 2051   http://ntusweety.herokuapp.com/history?&id=422+M0022&cl=
## 2052   http://ntusweety.herokuapp.com/history?&id=422+M0040&cl=
## 2053   http://ntusweety.herokuapp.com/history?&id=422+M0120&cl=
## 2054   http://ntusweety.herokuapp.com/history?&id=422+M0140&cl=
## 2055   http://ntusweety.herokuapp.com/history?&id=422+M1012&cl=
## 2056   http://ntusweety.herokuapp.com/history?&id=422+M1090&cl=
## 2057   http://ntusweety.herokuapp.com/history?&id=422EM1120&cl=
## 2058   http://ntusweety.herokuapp.com/history?&id=422EM1140&cl=
## 2059   http://ntusweety.herokuapp.com/history?&id=422+M1420&cl=
## 2060   http://ntusweety.herokuapp.com/history?&id=422+M1810&cl=
## 2061   http://ntusweety.herokuapp.com/history?&id=422+M2240&cl=
## 2062   http://ntusweety.herokuapp.com/history?&id=422+M2260&cl=
## 2063   http://ntusweety.herokuapp.com/history?&id=422+M2420&cl=
## 2064   http://ntusweety.herokuapp.com/history?&id=422+M2440&cl=
## 2065   http://ntusweety.herokuapp.com/history?&id=422+M2520&cl=
## 2066   http://ntusweety.herokuapp.com/history?&id=422+M3020&cl=
## 2067   http://ntusweety.herokuapp.com/history?&id=422+M3040&cl=
## 2068   http://ntusweety.herokuapp.com/history?&id=422+M3060&cl=
## 2069   http://ntusweety.herokuapp.com/history?&id=422+M3140&cl=
## 2070   http://ntusweety.herokuapp.com/history?&id=422+M3320&cl=
## 2071   http://ntusweety.herokuapp.com/history?&id=422+M3340&cl=
## 2072   http://ntusweety.herokuapp.com/history?&id=422+M3500&cl=
## 2073   http://ntusweety.herokuapp.com/history?&id=422+M4070&cl=
## 2074   http://ntusweety.herokuapp.com/history?&id=422+M4090&cl=
## 2075   http://ntusweety.herokuapp.com/history?&id=422+M4170&cl=
## 2076   http://ntusweety.herokuapp.com/history?&id=422+M4190&cl=
## 2077   http://ntusweety.herokuapp.com/history?&id=422+M4270&cl=
## 2078   http://ntusweety.herokuapp.com/history?&id=422+M4290&cl=
## 2079   http://ntusweety.herokuapp.com/history?&id=422+M4370&cl=
## 2080   http://ntusweety.herokuapp.com/history?&id=422+M4390&cl=
## 2081   http://ntusweety.herokuapp.com/history?&id=422+M4420&cl=
## 2082   http://ntusweety.herokuapp.com/history?&id=422+M5040&cl=
## 2083   http://ntusweety.herokuapp.com/history?&id=422+M5140&cl=
## 2084   http://ntusweety.herokuapp.com/history?&id=422+M5240&cl=
## 2085   http://ntusweety.herokuapp.com/history?&id=422+M5340&cl=
## 2086   http://ntusweety.herokuapp.com/history?&id=422+M6020&cl=
## 2087   http://ntusweety.herokuapp.com/history?&id=422+M6040&cl=
## 2088   http://ntusweety.herokuapp.com/history?&id=422+M6060&cl=
## 2089   http://ntusweety.herokuapp.com/history?&id=422+M6080&cl=
## 2090   http://ntusweety.herokuapp.com/history?&id=422+M6120&cl=
## 2091   http://ntusweety.herokuapp.com/history?&id=422+M6140&cl=
## 2092   http://ntusweety.herokuapp.com/history?&id=422+M6190&cl=
## 2093   http://ntusweety.herokuapp.com/history?&id=422+M7020&cl=
## 2094   http://ntusweety.herokuapp.com/history?&id=422+M7040&cl=
## 2095   http://ntusweety.herokuapp.com/history?&id=422+M7060&cl=
## 2096   http://ntusweety.herokuapp.com/history?&id=422+M7120&cl=
## 2097   http://ntusweety.herokuapp.com/history?&id=422+M7140&cl=
## 2098   http://ntusweety.herokuapp.com/history?&id=422+M7220&cl=
## 2099   http://ntusweety.herokuapp.com/history?&id=422+M7240&cl=
## 2100   http://ntusweety.herokuapp.com/history?&id=422+M7320&cl=
## 2101   http://ntusweety.herokuapp.com/history?&id=422+M7340&cl=
## 2102   http://ntusweety.herokuapp.com/history?&id=422+M7430&cl=
## 2103   http://ntusweety.herokuapp.com/history?&id=422+M8020&cl=
## 2104   http://ntusweety.herokuapp.com/history?&id=422+M8040&cl=
## 2105   http://ntusweety.herokuapp.com/history?&id=422+M8220&cl=
## 2106   http://ntusweety.herokuapp.com/history?&id=422+M8240&cl=
## 2107   http://ntusweety.herokuapp.com/history?&id=422+M8312&cl=
## 2108   http://ntusweety.herokuapp.com/history?&id=422+M8322&cl=
## 2109   http://ntusweety.herokuapp.com/history?&id=422+M8420&cl=
## 2110   http://ntusweety.herokuapp.com/history?&id=422+M8440&cl=
## 2111   http://ntusweety.herokuapp.com/history?&id=422+M9020&cl=
## 2112   http://ntusweety.herokuapp.com/history?&id=422+M9040&cl=
## 2113   http://ntusweety.herokuapp.com/history?&id=422+M9060&cl=
## 2114   http://ntusweety.herokuapp.com/history?&id=422+M9080&cl=
## 2115   http://ntusweety.herokuapp.com/history?&id=422+M9652&cl=
## 2116   http://ntusweety.herokuapp.com/history?&id=422+M9672&cl=
## 2117   http://ntusweety.herokuapp.com/history?&id=423+D0010&cl=
## 2118 http://ntusweety.herokuapp.com/history?&id=423ED0030&cl=01
## 2119 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=01
## 2120 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=02
## 2121 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=03
## 2122 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=05
## 2123 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=07
## 2124 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=08
## 2125 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=09
## 2126 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=12
## 2127 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=13
## 2128 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=15
## 2129 http://ntusweety.herokuapp.com/history?&id=423+D0040&cl=17
## 2130   http://ntusweety.herokuapp.com/history?&id=423+M0010&cl=
## 2131 http://ntusweety.herokuapp.com/history?&id=423EM0030&cl=01
## 2132 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=01
## 2133 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=02
## 2134 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=03
## 2135 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=04
## 2136 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=05
## 2137 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=06
## 2138 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=07
## 2139 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=08
## 2140 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=09
## 2141 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=10
## 2142 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=11
## 2143 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=12
## 2144 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=13
## 2145 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=15
## 2146 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=16
## 2147 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=17
## 2148 http://ntusweety.herokuapp.com/history?&id=423+M0040&cl=18
## 2149   http://ntusweety.herokuapp.com/history?&id=423+M1130&cl=
## 2150   http://ntusweety.herokuapp.com/history?&id=423+U0530&cl=
## 2151   http://ntusweety.herokuapp.com/history?&id=423+U0540&cl=
## 2152   http://ntusweety.herokuapp.com/history?&id=423+U1600&cl=
## 2153   http://ntusweety.herokuapp.com/history?&id=423+U2350&cl=
## 2154   http://ntusweety.herokuapp.com/history?&id=423+U2360&cl=
## 2155   http://ntusweety.herokuapp.com/history?&id=423+U2370&cl=
## 2156   http://ntusweety.herokuapp.com/history?&id=423+U2380&cl=
## 2157   http://ntusweety.herokuapp.com/history?&id=423+U3310&cl=
## 2158   http://ntusweety.herokuapp.com/history?&id=423+U3410&cl=
## 2159   http://ntusweety.herokuapp.com/history?&id=423+U3450&cl=
## 2160   http://ntusweety.herokuapp.com/history?&id=423+U3510&cl=
## 2161   http://ntusweety.herokuapp.com/history?&id=423+U3520&cl=
## 2162   http://ntusweety.herokuapp.com/history?&id=423+U3600&cl=
## 2163 http://ntusweety.herokuapp.com/history?&id=423+U3710&cl=01
## 2164 http://ntusweety.herokuapp.com/history?&id=423+U3710&cl=02
## 2165 http://ntusweety.herokuapp.com/history?&id=423+U3710&cl=03
## 2166 http://ntusweety.herokuapp.com/history?&id=423+U3720&cl=01
## 2167   http://ntusweety.herokuapp.com/history?&id=423+U3750&cl=
## 2168   http://ntusweety.herokuapp.com/history?&id=423+U3760&cl=
## 2169   http://ntusweety.herokuapp.com/history?&id=423+U3910&cl=
## 2170   http://ntusweety.herokuapp.com/history?&id=424+D0010&cl=
## 2171   http://ntusweety.herokuapp.com/history?&id=424+D1000&cl=
## 2172   http://ntusweety.herokuapp.com/history?&id=424+M0010&cl=
## 2173   http://ntusweety.herokuapp.com/history?&id=424+M0020&cl=
## 2174   http://ntusweety.herokuapp.com/history?&id=424+M5900&cl=
## 2175   http://ntusweety.herokuapp.com/history?&id=424+M7000&cl=
## 2176   http://ntusweety.herokuapp.com/history?&id=424+U1131&cl=
## 2177   http://ntusweety.herokuapp.com/history?&id=424+U1132&cl=
## 2178   http://ntusweety.herokuapp.com/history?&id=424+U2100&cl=
## 2179   http://ntusweety.herokuapp.com/history?&id=424+U5110&cl=
## 2180   http://ntusweety.herokuapp.com/history?&id=424+U5200&cl=
## 2181   http://ntusweety.herokuapp.com/history?&id=426+D0010&cl=
## 2182 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=01
## 2183 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=06
## 2184 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=08
## 2185 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=10
## 2186 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=12
## 2187 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=14
## 2188 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=15
## 2189 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=17
## 2190 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=18
## 2191 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=19
## 2192 http://ntusweety.herokuapp.com/history?&id=426+D0130&cl=21
## 2193   http://ntusweety.herokuapp.com/history?&id=426+D4380&cl=
## 2194   http://ntusweety.herokuapp.com/history?&id=426+D4440&cl=
## 2195   http://ntusweety.herokuapp.com/history?&id=426+D4450&cl=
## 2196   http://ntusweety.herokuapp.com/history?&id=426+D4460&cl=
## 2197   http://ntusweety.herokuapp.com/history?&id=426+M0010&cl=
## 2198   http://ntusweety.herokuapp.com/history?&id=426+M0280&cl=
## 2199   http://ntusweety.herokuapp.com/history?&id=426+M1100&cl=
## 2200   http://ntusweety.herokuapp.com/history?&id=426+M4380&cl=
## 2201   http://ntusweety.herokuapp.com/history?&id=426+M4400&cl=
## 2202   http://ntusweety.herokuapp.com/history?&id=426+M4440&cl=
## 2203   http://ntusweety.herokuapp.com/history?&id=426+M4460&cl=
## 2204   http://ntusweety.herokuapp.com/history?&id=426+M4470&cl=
## 2205   http://ntusweety.herokuapp.com/history?&id=426+M4490&cl=
## 2206   http://ntusweety.herokuapp.com/history?&id=426+M4510&cl=
## 2207   http://ntusweety.herokuapp.com/history?&id=426+M4530&cl=
## 2208   http://ntusweety.herokuapp.com/history?&id=426+M4550&cl=
## 2209   http://ntusweety.herokuapp.com/history?&id=426+M4570&cl=
## 2210   http://ntusweety.herokuapp.com/history?&id=426+M4590&cl=
## 2211   http://ntusweety.herokuapp.com/history?&id=426+M4680&cl=
## 2212   http://ntusweety.herokuapp.com/history?&id=426+M4690&cl=
## 2213   http://ntusweety.herokuapp.com/history?&id=426+U0200&cl=
## 2214   http://ntusweety.herokuapp.com/history?&id=428+D0010&cl=
## 2215   http://ntusweety.herokuapp.com/history?&id=428+D0150&cl=
## 2216   http://ntusweety.herokuapp.com/history?&id=428+D0160&cl=
## 2217   http://ntusweety.herokuapp.com/history?&id=428+D0170&cl=
## 2218   http://ntusweety.herokuapp.com/history?&id=428+D0180&cl=
## 2219   http://ntusweety.herokuapp.com/history?&id=428+D0190&cl=
## 2220   http://ntusweety.herokuapp.com/history?&id=428+D0200&cl=
## 2221   http://ntusweety.herokuapp.com/history?&id=428+D0210&cl=
## 2222   http://ntusweety.herokuapp.com/history?&id=428+D0220&cl=
## 2223   http://ntusweety.herokuapp.com/history?&id=428+D0230&cl=
## 2224   http://ntusweety.herokuapp.com/history?&id=428+D0240&cl=
## 2225   http://ntusweety.herokuapp.com/history?&id=428+D0250&cl=
## 2226   http://ntusweety.herokuapp.com/history?&id=428+D0260&cl=
## 2227   http://ntusweety.herokuapp.com/history?&id=428+D0270&cl=
## 2228   http://ntusweety.herokuapp.com/history?&id=428+D0280&cl=
## 2229   http://ntusweety.herokuapp.com/history?&id=428+D0290&cl=
## 2230   http://ntusweety.herokuapp.com/history?&id=428+D0300&cl=
## 2231   http://ntusweety.herokuapp.com/history?&id=428+D0310&cl=
## 2232   http://ntusweety.herokuapp.com/history?&id=428+D0320&cl=
## 2233   http://ntusweety.herokuapp.com/history?&id=428+D0330&cl=
## 2234   http://ntusweety.herokuapp.com/history?&id=428+D0340&cl=
## 2235   http://ntusweety.herokuapp.com/history?&id=428+D0350&cl=
## 2236   http://ntusweety.herokuapp.com/history?&id=428+D0530&cl=
## 2237   http://ntusweety.herokuapp.com/history?&id=428+D0540&cl=
## 2238   http://ntusweety.herokuapp.com/history?&id=428+D0550&cl=
## 2239   http://ntusweety.herokuapp.com/history?&id=428+M0010&cl=
## 2240   http://ntusweety.herokuapp.com/history?&id=428+M0030&cl=
## 2241   http://ntusweety.herokuapp.com/history?&id=428+M0040&cl=
## 2242   http://ntusweety.herokuapp.com/history?&id=428+M0050&cl=
## 2243   http://ntusweety.herokuapp.com/history?&id=428+M0060&cl=
## 2244   http://ntusweety.herokuapp.com/history?&id=428+M0070&cl=
## 2245   http://ntusweety.herokuapp.com/history?&id=428+M0080&cl=
## 2246   http://ntusweety.herokuapp.com/history?&id=428+M0090&cl=
## 2247   http://ntusweety.herokuapp.com/history?&id=428+M0200&cl=
## 2248   http://ntusweety.herokuapp.com/history?&id=428+M1110&cl=
## 2249   http://ntusweety.herokuapp.com/history?&id=428+M1120&cl=
## 2250   http://ntusweety.herokuapp.com/history?&id=428+M1200&cl=
## 2251   http://ntusweety.herokuapp.com/history?&id=428+M1270&cl=
## 2252   http://ntusweety.herokuapp.com/history?&id=428+M1300&cl=
## 2253   http://ntusweety.herokuapp.com/history?&id=428+M1470&cl=
## 2254   http://ntusweety.herokuapp.com/history?&id=428+M1480&cl=
## 2255   http://ntusweety.herokuapp.com/history?&id=428+M1490&cl=
## 2256   http://ntusweety.herokuapp.com/history?&id=428+M1500&cl=
## 2257   http://ntusweety.herokuapp.com/history?&id=428+M1510&cl=
## 2258   http://ntusweety.herokuapp.com/history?&id=428+M1520&cl=
## 2259   http://ntusweety.herokuapp.com/history?&id=428+M1530&cl=
## 2260   http://ntusweety.herokuapp.com/history?&id=428+M1540&cl=
## 2261   http://ntusweety.herokuapp.com/history?&id=428+M1550&cl=
## 2262   http://ntusweety.herokuapp.com/history?&id=428+M1560&cl=
## 2263   http://ntusweety.herokuapp.com/history?&id=428+M1570&cl=
## 2264   http://ntusweety.herokuapp.com/history?&id=428+M1580&cl=
## 2265   http://ntusweety.herokuapp.com/history?&id=428+M2050&cl=
## 2266   http://ntusweety.herokuapp.com/history?&id=428+M3050&cl=
## 2267   http://ntusweety.herokuapp.com/history?&id=428+M3070&cl=
## 2268   http://ntusweety.herokuapp.com/history?&id=428EU0050&cl=
## 2269   http://ntusweety.herokuapp.com/history?&id=429+D0010&cl=
## 2270 http://ntusweety.herokuapp.com/history?&id=429+D0110&cl=01
## 2271 http://ntusweety.herokuapp.com/history?&id=429+D0110&cl=02
## 2272 http://ntusweety.herokuapp.com/history?&id=429+D0110&cl=03
## 2273 http://ntusweety.herokuapp.com/history?&id=429+D0110&cl=05
## 2274 http://ntusweety.herokuapp.com/history?&id=429+D0120&cl=01
## 2275 http://ntusweety.herokuapp.com/history?&id=429+D0120&cl=02
## 2276 http://ntusweety.herokuapp.com/history?&id=429+D0120&cl=03
## 2277 http://ntusweety.herokuapp.com/history?&id=429+D0120&cl=05
## 2278 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=01
## 2279 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=02
## 2280 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=03
## 2281 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=04
## 2282 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=05
## 2283 http://ntusweety.herokuapp.com/history?&id=429+D0220&cl=08
## 2284 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=01
## 2285 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=02
## 2286 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=03
## 2287 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=04
## 2288 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=05
## 2289 http://ntusweety.herokuapp.com/history?&id=429+D0240&cl=06
## 2290 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=01
## 2291 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=02
## 2292 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=03
## 2293 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=04
## 2294 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=05
## 2295 http://ntusweety.herokuapp.com/history?&id=429+D0260&cl=06
## 2296 http://ntusweety.herokuapp.com/history?&id=429+D0280&cl=02
## 2297 http://ntusweety.herokuapp.com/history?&id=429+D0280&cl=03
## 2298 http://ntusweety.herokuapp.com/history?&id=429+D0280&cl=04
## 2299 http://ntusweety.herokuapp.com/history?&id=429+D0280&cl=05
## 2300 http://ntusweety.herokuapp.com/history?&id=429+D0280&cl=06
## 2301   http://ntusweety.herokuapp.com/history?&id=429+D0310&cl=
## 2302   http://ntusweety.herokuapp.com/history?&id=429+M0010&cl=
## 2303   http://ntusweety.herokuapp.com/history?&id=429+M0030&cl=
## 2304   http://ntusweety.herokuapp.com/history?&id=429+M0260&cl=
## 2305 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=01
## 2306 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=02
## 2307 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=03
## 2308 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=04
## 2309 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=05
## 2310 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=06
## 2311 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=07
## 2312 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=08
## 2313 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=09
## 2314 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=10
## 2315 http://ntusweety.herokuapp.com/history?&id=429+M0320&cl=11
## 2316 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=01
## 2317 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=03
## 2318 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=06
## 2319 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=07
## 2320 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=08
## 2321 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=10
## 2322 http://ntusweety.herokuapp.com/history?&id=429+M0340&cl=11
## 2323 http://ntusweety.herokuapp.com/history?&id=429+M0360&cl=02
## 2324 http://ntusweety.herokuapp.com/history?&id=429+M0360&cl=03
## 2325 http://ntusweety.herokuapp.com/history?&id=429+M0360&cl=04
## 2326 http://ntusweety.herokuapp.com/history?&id=429+M0360&cl=06
## 2327 http://ntusweety.herokuapp.com/history?&id=429+M0360&cl=08
## 2328 http://ntusweety.herokuapp.com/history?&id=429+M0380&cl=06
## 2329   http://ntusweety.herokuapp.com/history?&id=429+U0560&cl=
## 2330   http://ntusweety.herokuapp.com/history?&id=441+D0010&cl=
## 2331   http://ntusweety.herokuapp.com/history?&id=441+D0030&cl=
## 2332   http://ntusweety.herokuapp.com/history?&id=441+M0010&cl=
## 2333   http://ntusweety.herokuapp.com/history?&id=441+M0030&cl=
## 2334   http://ntusweety.herokuapp.com/history?&id=441+M1810&cl=
## 2335   http://ntusweety.herokuapp.com/history?&id=441+M2500&cl=
## 2336   http://ntusweety.herokuapp.com/history?&id=441+M2600&cl=
## 2337   http://ntusweety.herokuapp.com/history?&id=441+M3400&cl=
## 2338   http://ntusweety.herokuapp.com/history?&id=441+M3900&cl=
## 2339   http://ntusweety.herokuapp.com/history?&id=442+D0010&cl=
## 2340   http://ntusweety.herokuapp.com/history?&id=442+D0050&cl=
## 2341   http://ntusweety.herokuapp.com/history?&id=442+D1250&cl=
## 2342   http://ntusweety.herokuapp.com/history?&id=442+M0010&cl=
## 2343   http://ntusweety.herokuapp.com/history?&id=442+M0030&cl=
## 2344   http://ntusweety.herokuapp.com/history?&id=442+U0490&cl=
## 2345   http://ntusweety.herokuapp.com/history?&id=442+U0540&cl=
## 2346   http://ntusweety.herokuapp.com/history?&id=442+U0640&cl=
## 2347   http://ntusweety.herokuapp.com/history?&id=442+U0962&cl=
## 2348   http://ntusweety.herokuapp.com/history?&id=442+U1920&cl=
## 2349   http://ntusweety.herokuapp.com/history?&id=442+U2520&cl=
## 2350   http://ntusweety.herokuapp.com/history?&id=442+U2630&cl=
## 2351   http://ntusweety.herokuapp.com/history?&id=442+U2640&cl=
## 2352   http://ntusweety.herokuapp.com/history?&id=442+U2800&cl=
## 2353   http://ntusweety.herokuapp.com/history?&id=442+U2900&cl=
## 2354   http://ntusweety.herokuapp.com/history?&id=442+U3010&cl=
## 2355   http://ntusweety.herokuapp.com/history?&id=442+U3020&cl=
## 2356   http://ntusweety.herokuapp.com/history?&id=443+D0010&cl=
## 2357   http://ntusweety.herokuapp.com/history?&id=443+D0040&cl=
## 2358   http://ntusweety.herokuapp.com/history?&id=443+D1520&cl=
## 2359   http://ntusweety.herokuapp.com/history?&id=443+M0010&cl=
## 2360   http://ntusweety.herokuapp.com/history?&id=443+M0020&cl=
## 2361   http://ntusweety.herokuapp.com/history?&id=443+M1132&cl=
## 2362   http://ntusweety.herokuapp.com/history?&id=443+M1512&cl=
## 2363   http://ntusweety.herokuapp.com/history?&id=443+M1522&cl=
## 2364   http://ntusweety.herokuapp.com/history?&id=443+M1572&cl=
## 2365   http://ntusweety.herokuapp.com/history?&id=444+D0010&cl=
## 2366   http://ntusweety.herokuapp.com/history?&id=444+D0030&cl=
## 2367   http://ntusweety.herokuapp.com/history?&id=444+D0062&cl=
## 2368   http://ntusweety.herokuapp.com/history?&id=444+M0010&cl=
## 2369   http://ntusweety.herokuapp.com/history?&id=444+M0030&cl=
## 2370   http://ntusweety.herokuapp.com/history?&id=444+M1300&cl=
## 2371   http://ntusweety.herokuapp.com/history?&id=444+U1220&cl=
## 2372   http://ntusweety.herokuapp.com/history?&id=444+U1230&cl=
## 2373   http://ntusweety.herokuapp.com/history?&id=445+D0010&cl=
## 2374   http://ntusweety.herokuapp.com/history?&id=445ED0020&cl=
## 2375   http://ntusweety.herokuapp.com/history?&id=445+D1812&cl=
## 2376 http://ntusweety.herokuapp.com/history?&id=445+M0010&cl=01
## 2377 http://ntusweety.herokuapp.com/history?&id=445+M0010&cl=02
## 2378   http://ntusweety.herokuapp.com/history?&id=445+M0020&cl=
## 2379   http://ntusweety.herokuapp.com/history?&id=445+M0040&cl=
## 2380   http://ntusweety.herokuapp.com/history?&id=445+M1212&cl=
## 2381   http://ntusweety.herokuapp.com/history?&id=445+M1312&cl=
## 2382   http://ntusweety.herokuapp.com/history?&id=445+M1350&cl=
## 2383   http://ntusweety.herokuapp.com/history?&id=445+M1610&cl=
## 2384   http://ntusweety.herokuapp.com/history?&id=445+M1650&cl=
## 2385   http://ntusweety.herokuapp.com/history?&id=445+M1780&cl=
## 2386   http://ntusweety.herokuapp.com/history?&id=445+M1812&cl=
## 2387   http://ntusweety.herokuapp.com/history?&id=445+M1972&cl=
## 2388   http://ntusweety.herokuapp.com/history?&id=445+M1992&cl=
## 2389   http://ntusweety.herokuapp.com/history?&id=445+M2300&cl=
## 2390   http://ntusweety.herokuapp.com/history?&id=446+D0010&cl=
## 2391   http://ntusweety.herokuapp.com/history?&id=446+D0022&cl=
## 2392   http://ntusweety.herokuapp.com/history?&id=446+M0010&cl=
## 2393   http://ntusweety.herokuapp.com/history?&id=446+M0060&cl=
## 2394   http://ntusweety.herokuapp.com/history?&id=446+M0070&cl=
## 2395   http://ntusweety.herokuapp.com/history?&id=446+M0080&cl=
## 2396   http://ntusweety.herokuapp.com/history?&id=446+M1212&cl=
## 2397   http://ntusweety.herokuapp.com/history?&id=446+M1400&cl=
## 2398   http://ntusweety.herokuapp.com/history?&id=446+M1512&cl=
## 2399   http://ntusweety.herokuapp.com/history?&id=446+M2500&cl=
## 2400   http://ntusweety.herokuapp.com/history?&id=446+M2550&cl=
## 2401   http://ntusweety.herokuapp.com/history?&id=446+M4172&cl=
## 2402   http://ntusweety.herokuapp.com/history?&id=447+D0010&cl=
## 2403   http://ntusweety.herokuapp.com/history?&id=447+D0150&cl=
## 2404   http://ntusweety.herokuapp.com/history?&id=447+D0200&cl=
## 2405   http://ntusweety.herokuapp.com/history?&id=447+D0300&cl=
## 2406   http://ntusweety.herokuapp.com/history?&id=447+D0320&cl=
## 2407   http://ntusweety.herokuapp.com/history?&id=447+D0340&cl=
## 2408   http://ntusweety.herokuapp.com/history?&id=447+M0010&cl=
## 2409   http://ntusweety.herokuapp.com/history?&id=447+M0030&cl=
## 2410   http://ntusweety.herokuapp.com/history?&id=447+M0320&cl=
## 2411   http://ntusweety.herokuapp.com/history?&id=447+M0340&cl=
## 2412   http://ntusweety.herokuapp.com/history?&id=447+M1150&cl=
## 2413   http://ntusweety.herokuapp.com/history?&id=447+U2300&cl=
## 2414   http://ntusweety.herokuapp.com/history?&id=448+D0010&cl=
## 2415   http://ntusweety.herokuapp.com/history?&id=448+D0020&cl=
## 2416   http://ntusweety.herokuapp.com/history?&id=448+D0040&cl=
## 2417   http://ntusweety.herokuapp.com/history?&id=448+D0080&cl=
## 2418   http://ntusweety.herokuapp.com/history?&id=448+M0010&cl=
## 2419 http://ntusweety.herokuapp.com/history?&id=448+M0020&cl=01
## 2420   http://ntusweety.herokuapp.com/history?&id=448+M0040&cl=
## 2421   http://ntusweety.herokuapp.com/history?&id=448+M0240&cl=
## 2422   http://ntusweety.herokuapp.com/history?&id=448+M0250&cl=
## 2423   http://ntusweety.herokuapp.com/history?&id=448+M0260&cl=
## 2424   http://ntusweety.herokuapp.com/history?&id=448+M0280&cl=
## 2425   http://ntusweety.herokuapp.com/history?&id=448+M0330&cl=
## 2426   http://ntusweety.herokuapp.com/history?&id=448+M0350&cl=
## 2427   http://ntusweety.herokuapp.com/history?&id=449+D0010&cl=
## 2428   http://ntusweety.herokuapp.com/history?&id=449+D0020&cl=
## 2429   http://ntusweety.herokuapp.com/history?&id=449+M0010&cl=
## 2430   http://ntusweety.herokuapp.com/history?&id=449+M1080&cl=
## 2431   http://ntusweety.herokuapp.com/history?&id=449+M1130&cl=
## 2432   http://ntusweety.herokuapp.com/history?&id=449+M1150&cl=
## 2433   http://ntusweety.herokuapp.com/history?&id=449+M1212&cl=
## 2434   http://ntusweety.herokuapp.com/history?&id=449+M1222&cl=
## 2435   http://ntusweety.herokuapp.com/history?&id=449+M1232&cl=
## 2436   http://ntusweety.herokuapp.com/history?&id=449+M1252&cl=
## 2437   http://ntusweety.herokuapp.com/history?&id=449+M1262&cl=
## 2438   http://ntusweety.herokuapp.com/history?&id=449+M1290&cl=
## 2439   http://ntusweety.herokuapp.com/history?&id=449+M1300&cl=
## 2440   http://ntusweety.herokuapp.com/history?&id=449+M1320&cl=
## 2441   http://ntusweety.herokuapp.com/history?&id=449+M1332&cl=
## 2442   http://ntusweety.herokuapp.com/history?&id=450+D0300&cl=
## 2443   http://ntusweety.herokuapp.com/history?&id=450+D0400&cl=
## 2444   http://ntusweety.herokuapp.com/history?&id=450+D2300&cl=
## 2445   http://ntusweety.herokuapp.com/history?&id=450+D4000&cl=
## 2446   http://ntusweety.herokuapp.com/history?&id=450+M0010&cl=
## 2447   http://ntusweety.herokuapp.com/history?&id=450+M0200&cl=
## 2448   http://ntusweety.herokuapp.com/history?&id=450+M0220&cl=
## 2449   http://ntusweety.herokuapp.com/history?&id=450+M0310&cl=
## 2450   http://ntusweety.herokuapp.com/history?&id=450+M2100&cl=
## 2451   http://ntusweety.herokuapp.com/history?&id=450+M2500&cl=
## 2452   http://ntusweety.herokuapp.com/history?&id=450+M2600&cl=
## 2453   http://ntusweety.herokuapp.com/history?&id=450+M2700&cl=
## 2454   http://ntusweety.herokuapp.com/history?&id=450+M2850&cl=
## 2455   http://ntusweety.herokuapp.com/history?&id=450+M3310&cl=
## 2456   http://ntusweety.herokuapp.com/history?&id=450+M3320&cl=
## 2457   http://ntusweety.herokuapp.com/history?&id=450+M4600&cl=
## 2458   http://ntusweety.herokuapp.com/history?&id=450+M4800&cl=
## 2459   http://ntusweety.herokuapp.com/history?&id=450+M6600&cl=
## 2460   http://ntusweety.herokuapp.com/history?&id=451+M0010&cl=
## 2461   http://ntusweety.herokuapp.com/history?&id=451+M0030&cl=
## 2462   http://ntusweety.herokuapp.com/history?&id=451+M0040&cl=
## 2463   http://ntusweety.herokuapp.com/history?&id=451+U0710&cl=
## 2464   http://ntusweety.herokuapp.com/history?&id=451+U0800&cl=
## 2465   http://ntusweety.herokuapp.com/history?&id=452+M0010&cl=
## 2466   http://ntusweety.herokuapp.com/history?&id=452+M0220&cl=
## 2467   http://ntusweety.herokuapp.com/history?&id=452+M0240&cl=
## 2468   http://ntusweety.herokuapp.com/history?&id=452+M0270&cl=
## 2469   http://ntusweety.herokuapp.com/history?&id=452+M0300&cl=
## 2470   http://ntusweety.herokuapp.com/history?&id=452+M0362&cl=
## 2471   http://ntusweety.herokuapp.com/history?&id=452+M0410&cl=
## 2472   http://ntusweety.herokuapp.com/history?&id=452+M0430&cl=
## 2473   http://ntusweety.herokuapp.com/history?&id=452+M0440&cl=
## 2474   http://ntusweety.herokuapp.com/history?&id=452+U0080&cl=
## 2475   http://ntusweety.herokuapp.com/history?&id=453+D0010&cl=
## 2476   http://ntusweety.herokuapp.com/history?&id=453+D0020&cl=
## 2477   http://ntusweety.herokuapp.com/history?&id=453+D0040&cl=
## 2478   http://ntusweety.herokuapp.com/history?&id=453+D0090&cl=
## 2479   http://ntusweety.herokuapp.com/history?&id=453+D0100&cl=
## 2480   http://ntusweety.herokuapp.com/history?&id=453+D0150&cl=
## 2481   http://ntusweety.herokuapp.com/history?&id=453+D0160&cl=
## 2482   http://ntusweety.herokuapp.com/history?&id=454+M0010&cl=
## 2483   http://ntusweety.herokuapp.com/history?&id=454+M0020&cl=
## 2484   http://ntusweety.herokuapp.com/history?&id=454+M0110&cl=
## 2485   http://ntusweety.herokuapp.com/history?&id=454+M0210&cl=
## 2486   http://ntusweety.herokuapp.com/history?&id=455+D0010&cl=
## 2487   http://ntusweety.herokuapp.com/history?&id=455+D0030&cl=
## 2488   http://ntusweety.herokuapp.com/history?&id=455+D0060&cl=
## 2489   http://ntusweety.herokuapp.com/history?&id=455+D0070&cl=
## 2490   http://ntusweety.herokuapp.com/history?&id=455+D0080&cl=
## 2491   http://ntusweety.herokuapp.com/history?&id=455+D0090&cl=
## 2492   http://ntusweety.herokuapp.com/history?&id=456ED0010&cl=
## 2493   http://ntusweety.herokuapp.com/history?&id=456ED0050&cl=
## 2494   http://ntusweety.herokuapp.com/history?&id=456ED0070&cl=
## 2495   http://ntusweety.herokuapp.com/history?&id=456ED0080&cl=
## 2496   http://ntusweety.herokuapp.com/history?&id=456ED0090&cl=
## 2497   http://ntusweety.herokuapp.com/history?&id=456ED0260&cl=
## 2498 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=01
## 2499 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=02
## 2500 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=03
## 2501 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=04
## 2502 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=05
## 2503 http://ntusweety.herokuapp.com/history?&id=501+10710&cl=06
## 2504 http://ntusweety.herokuapp.com/history?&id=501+10800&cl=01
## 2505 http://ntusweety.herokuapp.com/history?&id=501+10800&cl=02
## 2506 http://ntusweety.herokuapp.com/history?&id=501+10800&cl=03
## 2507 http://ntusweety.herokuapp.com/history?&id=501+20020&cl=01
## 2508 http://ntusweety.herokuapp.com/history?&id=501+20020&cl=02
## 2509 http://ntusweety.herokuapp.com/history?&id=501+20020&cl=03
## 2510 http://ntusweety.herokuapp.com/history?&id=501E21100&cl=01
## 2511 http://ntusweety.herokuapp.com/history?&id=501+21100&cl=02
## 2512 http://ntusweety.herokuapp.com/history?&id=501+21100&cl=03
## 2513 http://ntusweety.herokuapp.com/history?&id=501+23000&cl=01
## 2514 http://ntusweety.herokuapp.com/history?&id=501+23000&cl=02
## 2515 http://ntusweety.herokuapp.com/history?&id=501+23000&cl=03
## 2516 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=01
## 2517 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=02
## 2518 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=03
## 2519 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=04
## 2520 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=05
## 2521 http://ntusweety.herokuapp.com/history?&id=501+23300&cl=06
## 2522   http://ntusweety.herokuapp.com/history?&id=501+25020&cl=
## 2523 http://ntusweety.herokuapp.com/history?&id=501+27900&cl=01
## 2524 http://ntusweety.herokuapp.com/history?&id=501+27900&cl=02
## 2525   http://ntusweety.herokuapp.com/history?&id=501+32020&cl=
## 2526   http://ntusweety.herokuapp.com/history?&id=501+32060&cl=
## 2527   http://ntusweety.herokuapp.com/history?&id=501+32220&cl=
## 2528   http://ntusweety.herokuapp.com/history?&id=501+32240&cl=
## 2529 http://ntusweety.herokuapp.com/history?&id=501+32410&cl=01
## 2530 http://ntusweety.herokuapp.com/history?&id=501+32410&cl=02
## 2531 http://ntusweety.herokuapp.com/history?&id=501+32410&cl=03
## 2532 http://ntusweety.herokuapp.com/history?&id=501+33360&cl=01
## 2533 http://ntusweety.herokuapp.com/history?&id=501+33360&cl=02
## 2534 http://ntusweety.herokuapp.com/history?&id=501+33360&cl=03
## 2535   http://ntusweety.herokuapp.com/history?&id=501+34250&cl=
## 2536 http://ntusweety.herokuapp.com/history?&id=501+35700&cl=01
## 2537 http://ntusweety.herokuapp.com/history?&id=501+35700&cl=02
## 2538 http://ntusweety.herokuapp.com/history?&id=501+36000&cl=01
## 2539 http://ntusweety.herokuapp.com/history?&id=501+36000&cl=02
## 2540 http://ntusweety.herokuapp.com/history?&id=501+36000&cl=03
## 2541 http://ntusweety.herokuapp.com/history?&id=501+37800&cl=01
## 2542 http://ntusweety.herokuapp.com/history?&id=501+37800&cl=02
## 2543   http://ntusweety.herokuapp.com/history?&id=501+39980&cl=
## 2544   http://ntusweety.herokuapp.com/history?&id=501+42100&cl=
## 2545   http://ntusweety.herokuapp.com/history?&id=501+44200&cl=
## 2546 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=01
## 2547 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=02
## 2548 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=03
## 2549 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=09
## 2550 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=10
## 2551 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=11
## 2552 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=12
## 2553 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=13
## 2554 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=14
## 2555 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=15
## 2556 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=17
## 2557 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=18
## 2558 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=19
## 2559 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=26
## 2560 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=27
## 2561 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=29
## 2562 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=30
## 2563 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=33
## 2564 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=34
## 2565 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=36
## 2566 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=37
## 2567 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=38
## 2568 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=39
## 2569 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=40
## 2570 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=41
## 2571 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=42
## 2572 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=43
## 2573 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=44
## 2574 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=45
## 2575 http://ntusweety.herokuapp.com/history?&id=501+49502&cl=46
## 2576   http://ntusweety.herokuapp.com/history?&id=501+49600&cl=
## 2577 http://ntusweety.herokuapp.com/history?&id=502+10100&cl=02
## 2578 http://ntusweety.herokuapp.com/history?&id=502+16000&cl=01
## 2579 http://ntusweety.herokuapp.com/history?&id=502+16000&cl=02
## 2580 http://ntusweety.herokuapp.com/history?&id=502+16000&cl=03
## 2581 http://ntusweety.herokuapp.com/history?&id=502+20002&cl=01
## 2582 http://ntusweety.herokuapp.com/history?&id=502+20002&cl=02
## 2583 http://ntusweety.herokuapp.com/history?&id=502+20002&cl=03
## 2584 http://ntusweety.herokuapp.com/history?&id=502+21140&cl=01
## 2585 http://ntusweety.herokuapp.com/history?&id=502+21140&cl=02
## 2586 http://ntusweety.herokuapp.com/history?&id=502E21140&cl=03
## 2587 http://ntusweety.herokuapp.com/history?&id=502+21800&cl=01
## 2588 http://ntusweety.herokuapp.com/history?&id=502+21800&cl=02
## 2589 http://ntusweety.herokuapp.com/history?&id=502+21800&cl=03
## 2590 http://ntusweety.herokuapp.com/history?&id=502+31000&cl=01
## 2591 http://ntusweety.herokuapp.com/history?&id=502+31000&cl=02
## 2592 http://ntusweety.herokuapp.com/history?&id=502+31000&cl=03
## 2593 http://ntusweety.herokuapp.com/history?&id=502+34100&cl=01
## 2594 http://ntusweety.herokuapp.com/history?&id=502+34100&cl=02
## 2595 http://ntusweety.herokuapp.com/history?&id=502+34100&cl=03
## 2596 http://ntusweety.herokuapp.com/history?&id=502+35150&cl=01
## 2597 http://ntusweety.herokuapp.com/history?&id=502+35150&cl=02
## 2598 http://ntusweety.herokuapp.com/history?&id=502+35150&cl=03
## 2599   http://ntusweety.herokuapp.com/history?&id=502+41330&cl=
## 2600   http://ntusweety.herokuapp.com/history?&id=502+45230&cl=
## 2601   http://ntusweety.herokuapp.com/history?&id=502+45350&cl=
## 2602   http://ntusweety.herokuapp.com/history?&id=502+45400&cl=
## 2603   http://ntusweety.herokuapp.com/history?&id=502+45410&cl=
## 2604 http://ntusweety.herokuapp.com/history?&id=504+10300&cl=01
## 2605 http://ntusweety.herokuapp.com/history?&id=504+10300&cl=02
## 2606   http://ntusweety.herokuapp.com/history?&id=504+20100&cl=
## 2607 http://ntusweety.herokuapp.com/history?&id=504+220A0&cl=01
## 2608 http://ntusweety.herokuapp.com/history?&id=504+220A0&cl=02
## 2609 http://ntusweety.herokuapp.com/history?&id=504+26110&cl=01
## 2610 http://ntusweety.herokuapp.com/history?&id=504+26110&cl=02
## 2611 http://ntusweety.herokuapp.com/history?&id=504+27120&cl=01
## 2612 http://ntusweety.herokuapp.com/history?&id=504+27120&cl=02
## 2613   http://ntusweety.herokuapp.com/history?&id=504+305A0&cl=
## 2614   http://ntusweety.herokuapp.com/history?&id=504+32120&cl=
## 2615 http://ntusweety.herokuapp.com/history?&id=504+32130&cl=01
## 2616 http://ntusweety.herokuapp.com/history?&id=504+32130&cl=02
## 2617 http://ntusweety.herokuapp.com/history?&id=504+32210&cl=01
## 2618 http://ntusweety.herokuapp.com/history?&id=504+32210&cl=02
## 2619 http://ntusweety.herokuapp.com/history?&id=504+32210&cl=03
## 2620 http://ntusweety.herokuapp.com/history?&id=504+32210&cl=04
## 2621 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=05
## 2622 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=06
## 2623 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=08
## 2624 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=09
## 2625 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=11
## 2626 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=12
## 2627 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=13
## 2628 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=14
## 2629 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=15
## 2630 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=17
## 2631 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=18
## 2632 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=19
## 2633 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=20
## 2634 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=21
## 2635 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=22
## 2636 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=23
## 2637 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=24
## 2638 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=25
## 2639 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=26
## 2640 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=27
## 2641 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=28
## 2642 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=29
## 2643 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=30
## 2644 http://ntusweety.herokuapp.com/history?&id=504E400C0&cl=31
## 2645 http://ntusweety.herokuapp.com/history?&id=504E400C0&cl=32
## 2646 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=33
## 2647 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=34
## 2648 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=35
## 2649 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=36
## 2650 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=37
## 2651 http://ntusweety.herokuapp.com/history?&id=504+400C0&cl=38
## 2652 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=08
## 2653 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=09
## 2654 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=12
## 2655 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=14
## 2656 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=17
## 2657 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=18
## 2658 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=20
## 2659 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=21
## 2660 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=22
## 2661 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=23
## 2662 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=24
## 2663 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=25
## 2664 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=26
## 2665 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=27
## 2666 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=28
## 2667 http://ntusweety.herokuapp.com/history?&id=504E400E0&cl=30
## 2668 http://ntusweety.herokuapp.com/history?&id=504E400E0&cl=31
## 2669 http://ntusweety.herokuapp.com/history?&id=504E400E0&cl=32
## 2670 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=33
## 2671 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=34
## 2672 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=35
## 2673 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=36
## 2674 http://ntusweety.herokuapp.com/history?&id=504+400E0&cl=37
## 2675 http://ntusweety.herokuapp.com/history?&id=504+42000&cl=01
## 2676 http://ntusweety.herokuapp.com/history?&id=504+42000&cl=02
## 2677   http://ntusweety.herokuapp.com/history?&id=504+43100&cl=
## 2678 http://ntusweety.herokuapp.com/history?&id=504+49000&cl=01
## 2679 http://ntusweety.herokuapp.com/history?&id=504+49000&cl=02
## 2680   http://ntusweety.herokuapp.com/history?&id=505+10090&cl=
## 2681   http://ntusweety.herokuapp.com/history?&id=505+101A2&cl=
## 2682   http://ntusweety.herokuapp.com/history?&id=505+21550&cl=
## 2683   http://ntusweety.herokuapp.com/history?&id=505+22160&cl=
## 2684   http://ntusweety.herokuapp.com/history?&id=505+22250&cl=
## 2685   http://ntusweety.herokuapp.com/history?&id=505+22270&cl=
## 2686   http://ntusweety.herokuapp.com/history?&id=505+23240&cl=
## 2687   http://ntusweety.herokuapp.com/history?&id=505+27100&cl=
## 2688 http://ntusweety.herokuapp.com/history?&id=505+28120&cl=02
## 2689   http://ntusweety.herokuapp.com/history?&id=505+29120&cl=
## 2690   http://ntusweety.herokuapp.com/history?&id=505+30140&cl=
## 2691   http://ntusweety.herokuapp.com/history?&id=505+31520&cl=
## 2692 http://ntusweety.herokuapp.com/history?&id=505+31590&cl=01
## 2693 http://ntusweety.herokuapp.com/history?&id=505+31590&cl=02
## 2694   http://ntusweety.herokuapp.com/history?&id=505+31620&cl=
## 2695   http://ntusweety.herokuapp.com/history?&id=505+31670&cl=
## 2696   http://ntusweety.herokuapp.com/history?&id=505+33000&cl=
## 2697   http://ntusweety.herokuapp.com/history?&id=505+43710&cl=
## 2698   http://ntusweety.herokuapp.com/history?&id=507+10700&cl=
## 2699   http://ntusweety.herokuapp.com/history?&id=507+10800&cl=
## 2700   http://ntusweety.herokuapp.com/history?&id=507+20102&cl=
## 2701   http://ntusweety.herokuapp.com/history?&id=507+20202&cl=
## 2702   http://ntusweety.herokuapp.com/history?&id=507+20500&cl=
## 2703   http://ntusweety.herokuapp.com/history?&id=507+20600&cl=
## 2704   http://ntusweety.herokuapp.com/history?&id=507+24000&cl=
## 2705   http://ntusweety.herokuapp.com/history?&id=507+30110&cl=
## 2706   http://ntusweety.herokuapp.com/history?&id=521+D0010&cl=
## 2707   http://ntusweety.herokuapp.com/history?&id=521+D2420&cl=
## 2708   http://ntusweety.herokuapp.com/history?&id=521+M0010&cl=
## 2709   http://ntusweety.herokuapp.com/history?&id=521+M0040&cl=
## 2710   http://ntusweety.herokuapp.com/history?&id=521+M0180&cl=
## 2711   http://ntusweety.herokuapp.com/history?&id=521+M0320&cl=
## 2712   http://ntusweety.herokuapp.com/history?&id=521+M1030&cl=
## 2713   http://ntusweety.herokuapp.com/history?&id=521+M1160&cl=
## 2714   http://ntusweety.herokuapp.com/history?&id=521EM1210&cl=
## 2715   http://ntusweety.herokuapp.com/history?&id=521+M1730&cl=
## 2716   http://ntusweety.herokuapp.com/history?&id=521+M2200&cl=
## 2717   http://ntusweety.herokuapp.com/history?&id=521EM2210&cl=
## 2718   http://ntusweety.herokuapp.com/history?&id=521+M2290&cl=
## 2719   http://ntusweety.herokuapp.com/history?&id=521+M5160&cl=
## 2720   http://ntusweety.herokuapp.com/history?&id=521+M5950&cl=
## 2721   http://ntusweety.herokuapp.com/history?&id=521+M6140&cl=
## 2722   http://ntusweety.herokuapp.com/history?&id=521EM6200&cl=
## 2723   http://ntusweety.herokuapp.com/history?&id=521+M6230&cl=
## 2724   http://ntusweety.herokuapp.com/history?&id=521+M6240&cl=
## 2725   http://ntusweety.herokuapp.com/history?&id=521+M6300&cl=
## 2726   http://ntusweety.herokuapp.com/history?&id=521EM6420&cl=
## 2727   http://ntusweety.herokuapp.com/history?&id=521+M6430&cl=
## 2728   http://ntusweety.herokuapp.com/history?&id=521+M6590&cl=
## 2729   http://ntusweety.herokuapp.com/history?&id=521+M6630&cl=
## 2730   http://ntusweety.herokuapp.com/history?&id=521+M7000&cl=
## 2731   http://ntusweety.herokuapp.com/history?&id=521+M7020&cl=
## 2732   http://ntusweety.herokuapp.com/history?&id=521+M7060&cl=
## 2733   http://ntusweety.herokuapp.com/history?&id=521+M7100&cl=
## 2734   http://ntusweety.herokuapp.com/history?&id=521+M7140&cl=
## 2735   http://ntusweety.herokuapp.com/history?&id=521+M7150&cl=
## 2736   http://ntusweety.herokuapp.com/history?&id=521EM7180&cl=
## 2737   http://ntusweety.herokuapp.com/history?&id=521EM7270&cl=
## 2738   http://ntusweety.herokuapp.com/history?&id=521+M7280&cl=
## 2739   http://ntusweety.herokuapp.com/history?&id=521+M7310&cl=
## 2740   http://ntusweety.herokuapp.com/history?&id=521EM7320&cl=
## 2741   http://ntusweety.herokuapp.com/history?&id=521+M7400&cl=
## 2742   http://ntusweety.herokuapp.com/history?&id=521EM7450&cl=
## 2743   http://ntusweety.herokuapp.com/history?&id=521+M7550&cl=
## 2744   http://ntusweety.herokuapp.com/history?&id=521+U0060&cl=
## 2745   http://ntusweety.herokuapp.com/history?&id=521+U0570&cl=
## 2746   http://ntusweety.herokuapp.com/history?&id=521EU0820&cl=
## 2747   http://ntusweety.herokuapp.com/history?&id=521+U3260&cl=
## 2748   http://ntusweety.herokuapp.com/history?&id=521+U3570&cl=
## 2749   http://ntusweety.herokuapp.com/history?&id=521+U3830&cl=
## 2750   http://ntusweety.herokuapp.com/history?&id=521+U3840&cl=
## 2751   http://ntusweety.herokuapp.com/history?&id=521+U8730&cl=
## 2752   http://ntusweety.herokuapp.com/history?&id=521+U8750&cl=
## 2753   http://ntusweety.herokuapp.com/history?&id=521+U8800&cl=
## 2754   http://ntusweety.herokuapp.com/history?&id=521+U8820&cl=
## 2755   http://ntusweety.herokuapp.com/history?&id=521EU8850&cl=
## 2756   http://ntusweety.herokuapp.com/history?&id=521+U8910&cl=
## 2757   http://ntusweety.herokuapp.com/history?&id=522+D0010&cl=
## 2758 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=01
## 2759 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=02
## 2760 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=03
## 2761 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=04
## 2762 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=05
## 2763 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=06
## 2764 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=07
## 2765 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=08
## 2766 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=09
## 2767 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=10
## 2768 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=11
## 2769 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=12
## 2770 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=13
## 2771 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=14
## 2772 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=15
## 2773 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=16
## 2774 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=17
## 2775 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=18
## 2776 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=19
## 2777 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=20
## 2778 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=21
## 2779 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=22
## 2780 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=23
## 2781 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=24
## 2782 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=25
## 2783 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=26
## 2784 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=27
## 2785 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=28
## 2786 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=29
## 2787 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=30
## 2788 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=31
## 2789 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=32
## 2790 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=33
## 2791 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=34
## 2792 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=35
## 2793 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=36
## 2794 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=37
## 2795 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=38
## 2796 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=39
## 2797 http://ntusweety.herokuapp.com/history?&id=522+D0090&cl=40
## 2798   http://ntusweety.herokuapp.com/history?&id=522+M0010&cl=
## 2799 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=01
## 2800 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=02
## 2801 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=03
## 2802 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=04
## 2803 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=05
## 2804 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=06
## 2805 http://ntusweety.herokuapp.com/history?&id=522+M0030&cl=07
## 2806 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=01
## 2807 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=02
## 2808 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=03
## 2809 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=04
## 2810 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=05
## 2811 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=06
## 2812 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=07
## 2813 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=08
## 2814 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=09
## 2815 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=10
## 2816 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=11
## 2817 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=12
## 2818 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=13
## 2819 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=14
## 2820 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=15
## 2821 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=16
## 2822 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=17
## 2823 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=18
## 2824 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=19
## 2825 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=20
## 2826 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=21
## 2827 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=22
## 2828 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=23
## 2829 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=24
## 2830 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=25
## 2831 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=26
## 2832 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=27
## 2833 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=28
## 2834 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=29
## 2835 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=30
## 2836 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=31
## 2837 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=32
## 2838 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=33
## 2839 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=34
## 2840 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=35
## 2841 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=36
## 2842 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=37
## 2843 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=38
## 2844 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=39
## 2845 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=40
## 2846 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=41
## 2847 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=42
## 2848 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=43
## 2849 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=44
## 2850 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=45
## 2851 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=46
## 2852 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=47
## 2853 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=48
## 2854 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=49
## 2855 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=50
## 2856 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=51
## 2857 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=52
## 2858 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=53
## 2859 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=54
## 2860 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=55
## 2861 http://ntusweety.herokuapp.com/history?&id=522+M0090&cl=56
## 2862   http://ntusweety.herokuapp.com/history?&id=522+M2830&cl=
## 2863   http://ntusweety.herokuapp.com/history?&id=522+M2880&cl=
## 2864   http://ntusweety.herokuapp.com/history?&id=522+M3500&cl=
## 2865   http://ntusweety.herokuapp.com/history?&id=522+M3790&cl=
## 2866   http://ntusweety.herokuapp.com/history?&id=522+M3960&cl=
## 2867   http://ntusweety.herokuapp.com/history?&id=522+M4020&cl=
## 2868 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=01
## 2869 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=02
## 2870 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=03
## 2871 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=04
## 2872 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=05
## 2873 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=06
## 2874 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=07
## 2875 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=08
## 2876 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=09
## 2877 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=10
## 2878 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=11
## 2879 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=12
## 2880 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=13
## 2881 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=14
## 2882 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=15
## 2883 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=16
## 2884 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=17
## 2885 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=18
## 2886 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=19
## 2887 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=20
## 2888 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=21
## 2889 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=22
## 2890 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=23
## 2891 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=24
## 2892 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=25
## 2893 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=26
## 2894 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=27
## 2895 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=28
## 2896 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=29
## 2897 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=30
## 2898 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=31
## 2899 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=32
## 2900 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=33
## 2901 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=34
## 2902 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=35
## 2903 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=36
## 2904 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=37
## 2905 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=38
## 2906 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=39
## 2907 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=40
## 2908 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=41
## 2909 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=42
## 2910 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=43
## 2911 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=44
## 2912 http://ntusweety.herokuapp.com/history?&id=522+U0090&cl=45
## 2913   http://ntusweety.herokuapp.com/history?&id=522+U1440&cl=
## 2914   http://ntusweety.herokuapp.com/history?&id=522+U3550&cl=
## 2915   http://ntusweety.herokuapp.com/history?&id=522+U4290&cl=
## 2916   http://ntusweety.herokuapp.com/history?&id=522+U4540&cl=
## 2917   http://ntusweety.herokuapp.com/history?&id=522+U4710&cl=
## 2918   http://ntusweety.herokuapp.com/history?&id=522+U4720&cl=
## 2919   http://ntusweety.herokuapp.com/history?&id=522+U4970&cl=
## 2920   http://ntusweety.herokuapp.com/history?&id=522+U5020&cl=
## 2921   http://ntusweety.herokuapp.com/history?&id=522+U5030&cl=
## 2922   http://ntusweety.herokuapp.com/history?&id=522+U5260&cl=
## 2923   http://ntusweety.herokuapp.com/history?&id=522+U5280&cl=
## 2924   http://ntusweety.herokuapp.com/history?&id=522+U5320&cl=
## 2925 http://ntusweety.herokuapp.com/history?&id=522+U5360&cl=02
## 2926   http://ntusweety.herokuapp.com/history?&id=522+U5400&cl=
## 2927   http://ntusweety.herokuapp.com/history?&id=522+U5540&cl=
## 2928   http://ntusweety.herokuapp.com/history?&id=522+U5630&cl=
## 2929   http://ntusweety.herokuapp.com/history?&id=522+U5790&cl=
## 2930   http://ntusweety.herokuapp.com/history?&id=522+U5860&cl=
## 2931   http://ntusweety.herokuapp.com/history?&id=522+U5900&cl=
## 2932   http://ntusweety.herokuapp.com/history?&id=522+U6010&cl=
## 2933   http://ntusweety.herokuapp.com/history?&id=522+U6020&cl=
## 2934   http://ntusweety.herokuapp.com/history?&id=522+U6100&cl=
## 2935   http://ntusweety.herokuapp.com/history?&id=524+D0010&cl=
## 2936 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=04
## 2937 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=05
## 2938 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=06
## 2939 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=08
## 2940 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=09
## 2941 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=10
## 2942 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=11
## 2943 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=12
## 2944 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=13
## 2945 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=14
## 2946 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=15
## 2947 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=16
## 2948 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=17
## 2949 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=18
## 2950 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=19
## 2951 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=20
## 2952 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=21
## 2953 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=22
## 2954 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=23
## 2955 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=24
## 2956 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=25
## 2957 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=26
## 2958 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=27
## 2959 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=28
## 2960 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=29
## 2961 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=30
## 2962 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=31
## 2963 http://ntusweety.herokuapp.com/history?&id=524ED8000&cl=32
## 2964 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=33
## 2965 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=34
## 2966 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=35
## 2967 http://ntusweety.herokuapp.com/history?&id=524+D8000&cl=37
## 2968   http://ntusweety.herokuapp.com/history?&id=524+M0010&cl=
## 2969   http://ntusweety.herokuapp.com/history?&id=524EM0030&cl=
## 2970   http://ntusweety.herokuapp.com/history?&id=524EM0160&cl=
## 2971 http://ntusweety.herokuapp.com/history?&id=524+M1110&cl=01
## 2972 http://ntusweety.herokuapp.com/history?&id=524EM1110&cl=02
## 2973 http://ntusweety.herokuapp.com/history?&id=524+M1200&cl=01
## 2974 http://ntusweety.herokuapp.com/history?&id=524EM1200&cl=02
## 2975   http://ntusweety.herokuapp.com/history?&id=524EM1340&cl=
## 2976   http://ntusweety.herokuapp.com/history?&id=524+M1350&cl=
## 2977 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=04
## 2978 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=05
## 2979 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=06
## 2980 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=08
## 2981 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=09
## 2982 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=10
## 2983 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=11
## 2984 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=12
## 2985 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=13
## 2986 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=14
## 2987 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=15
## 2988 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=16
## 2989 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=17
## 2990 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=18
## 2991 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=19
## 2992 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=20
## 2993 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=21
## 2994 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=22
## 2995 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=23
## 2996 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=24
## 2997 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=25
## 2998 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=26
## 2999 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=27
## 3000 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=28
## 3001 http://ntusweety.herokuapp.com/history?&id=524EM6020&cl=29
## 3002 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=30
## 3003 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=31
## 3004 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=32
## 3005 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=33
## 3006 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=34
## 3007 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=35
## 3008 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=36
## 3009 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=37
## 3010 http://ntusweety.herokuapp.com/history?&id=524+M6020&cl=38
## 3011 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=02
## 3012 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=04
## 3013 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=05
## 3014 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=06
## 3015 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=07
## 3016 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=08
## 3017 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=09
## 3018 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=10
## 3019 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=11
## 3020 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=12
## 3021 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=13
## 3022 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=14
## 3023 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=15
## 3024 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=16
## 3025 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=17
## 3026 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=18
## 3027 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=19
## 3028 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=20
## 3029 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=21
## 3030 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=22
## 3031 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=23
## 3032 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=24
## 3033 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=25
## 3034 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=26
## 3035 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=27
## 3036 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=28
## 3037 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=29
## 3038 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=30
## 3039 http://ntusweety.herokuapp.com/history?&id=524EM6040&cl=31
## 3040 http://ntusweety.herokuapp.com/history?&id=524EM6040&cl=32
## 3041 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=33
## 3042 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=34
## 3043 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=35
## 3044 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=36
## 3045 http://ntusweety.herokuapp.com/history?&id=524+M6040&cl=37
## 3046   http://ntusweety.herokuapp.com/history?&id=524+U1070&cl=
## 3047   http://ntusweety.herokuapp.com/history?&id=524+U1200&cl=
## 3048   http://ntusweety.herokuapp.com/history?&id=524+U1800&cl=
## 3049   http://ntusweety.herokuapp.com/history?&id=524+U1900&cl=
## 3050   http://ntusweety.herokuapp.com/history?&id=524+U2040&cl=
## 3051   http://ntusweety.herokuapp.com/history?&id=524+U2090&cl=
## 3052   http://ntusweety.herokuapp.com/history?&id=524+U2190&cl=
## 3053   http://ntusweety.herokuapp.com/history?&id=525+D0010&cl=
## 3054 http://ntusweety.herokuapp.com/history?&id=525+D0030&cl=01
## 3055 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=07
## 3056 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=10
## 3057 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=12
## 3058 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=16
## 3059 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=17
## 3060 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=18
## 3061 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=23
## 3062 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=24
## 3063 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=26
## 3064 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=27
## 3065 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=28
## 3066 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=35
## 3067 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=36
## 3068 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=39
## 3069 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=40
## 3070 http://ntusweety.herokuapp.com/history?&id=525+D0090&cl=41
## 3071   http://ntusweety.herokuapp.com/history?&id=525+M0010&cl=
## 3072 http://ntusweety.herokuapp.com/history?&id=525+M0030&cl=01
## 3073 http://ntusweety.herokuapp.com/history?&id=525+M0030&cl=02
## 3074 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=06
## 3075 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=10
## 3076 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=12
## 3077 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=14
## 3078 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=16
## 3079 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=17
## 3080 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=18
## 3081 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=19
## 3082 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=20
## 3083 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=23
## 3084 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=24
## 3085 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=26
## 3086 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=27
## 3087 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=28
## 3088 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=35
## 3089 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=36
## 3090 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=37
## 3091 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=38
## 3092 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=39
## 3093 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=40
## 3094 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=41
## 3095 http://ntusweety.herokuapp.com/history?&id=525+M0090&cl=43
## 3096   http://ntusweety.herokuapp.com/history?&id=525+M1920&cl=
## 3097   http://ntusweety.herokuapp.com/history?&id=525+M2520&cl=
## 3098   http://ntusweety.herokuapp.com/history?&id=525+M2600&cl=
## 3099   http://ntusweety.herokuapp.com/history?&id=525+M2850&cl=
## 3100 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=10
## 3101 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=12
## 3102 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=14
## 3103 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=17
## 3104 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=18
## 3105 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=20
## 3106 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=24
## 3107 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=26
## 3108 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=27
## 3109 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=28
## 3110 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=36
## 3111 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=37
## 3112 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=38
## 3113 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=39
## 3114 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=40
## 3115 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=41
## 3116 http://ntusweety.herokuapp.com/history?&id=525+U0010&cl=42
## 3117   http://ntusweety.herokuapp.com/history?&id=525+U0060&cl=
## 3118   http://ntusweety.herokuapp.com/history?&id=525+U0070&cl=
## 3119   http://ntusweety.herokuapp.com/history?&id=525+U0080&cl=
## 3120   http://ntusweety.herokuapp.com/history?&id=525+U0640&cl=
## 3121   http://ntusweety.herokuapp.com/history?&id=525+U2210&cl=
## 3122   http://ntusweety.herokuapp.com/history?&id=525+U2310&cl=
## 3123   http://ntusweety.herokuapp.com/history?&id=525+U8030&cl=
## 3124   http://ntusweety.herokuapp.com/history?&id=525+U9020&cl=
## 3125   http://ntusweety.herokuapp.com/history?&id=527+D0010&cl=
## 3126 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=02
## 3127 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=03
## 3128 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=05
## 3129 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=06
## 3130 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=07
## 3131 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=08
## 3132 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=09
## 3133 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=10
## 3134 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=11
## 3135 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=12
## 3136 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=13
## 3137 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=14
## 3138 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=16
## 3139 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=17
## 3140 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=18
## 3141 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=19
## 3142 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=20
## 3143 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=21
## 3144 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=22
## 3145 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=24
## 3146 http://ntusweety.herokuapp.com/history?&id=527+D0020&cl=26
## 3147   http://ntusweety.herokuapp.com/history?&id=527+M0010&cl=
## 3148 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=01
## 3149 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=02
## 3150 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=03
## 3151 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=04
## 3152 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=05
## 3153 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=06
## 3154 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=07
## 3155 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=08
## 3156 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=09
## 3157 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=10
## 3158 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=11
## 3159 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=12
## 3160 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=13
## 3161 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=14
## 3162 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=15
## 3163 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=16
## 3164 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=17
## 3165 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=18
## 3166 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=19
## 3167 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=20
## 3168 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=21
## 3169 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=22
## 3170 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=23
## 3171 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=24
## 3172 http://ntusweety.herokuapp.com/history?&id=527+M0020&cl=25
## 3173   http://ntusweety.herokuapp.com/history?&id=527+M0030&cl=
## 3174   http://ntusweety.herokuapp.com/history?&id=527+M0200&cl=
## 3175   http://ntusweety.herokuapp.com/history?&id=527+M0400&cl=
## 3176   http://ntusweety.herokuapp.com/history?&id=527+M1030&cl=
## 3177   http://ntusweety.herokuapp.com/history?&id=527+M1380&cl=
## 3178   http://ntusweety.herokuapp.com/history?&id=527+M1590&cl=
## 3179   http://ntusweety.herokuapp.com/history?&id=527EM1690&cl=
## 3180   http://ntusweety.herokuapp.com/history?&id=527+M1700&cl=
## 3181   http://ntusweety.herokuapp.com/history?&id=527+M4170&cl=
## 3182   http://ntusweety.herokuapp.com/history?&id=527+M4900&cl=
## 3183   http://ntusweety.herokuapp.com/history?&id=527+U0060&cl=
## 3184 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=02
## 3185 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=03
## 3186 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=04
## 3187 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=05
## 3188 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=06
## 3189 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=07
## 3190 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=08
## 3191 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=11
## 3192 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=12
## 3193 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=13
## 3194 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=14
## 3195 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=15
## 3196 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=16
## 3197 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=17
## 3198 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=18
## 3199 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=19
## 3200 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=20
## 3201 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=22
## 3202 http://ntusweety.herokuapp.com/history?&id=527+U0180&cl=24
## 3203 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=05
## 3204 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=06
## 3205 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=08
## 3206 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=10
## 3207 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=11
## 3208 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=12
## 3209 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=17
## 3210 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=21
## 3211 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=22
## 3212 http://ntusweety.herokuapp.com/history?&id=527+U0200&cl=23
## 3213   http://ntusweety.herokuapp.com/history?&id=527+U0280&cl=
## 3214   http://ntusweety.herokuapp.com/history?&id=527+U0290&cl=
## 3215   http://ntusweety.herokuapp.com/history?&id=527+U2060&cl=
## 3216   http://ntusweety.herokuapp.com/history?&id=527+U3100&cl=
## 3217   http://ntusweety.herokuapp.com/history?&id=541+D0010&cl=
## 3218   http://ntusweety.herokuapp.com/history?&id=541+D0030&cl=
## 3219   http://ntusweety.herokuapp.com/history?&id=541+D0070&cl=
## 3220   http://ntusweety.herokuapp.com/history?&id=541+D0190&cl=
## 3221   http://ntusweety.herokuapp.com/history?&id=541+M0010&cl=
## 3222   http://ntusweety.herokuapp.com/history?&id=541+M0020&cl=
## 3223 http://ntusweety.herokuapp.com/history?&id=541+M0040&cl=01
## 3224 http://ntusweety.herokuapp.com/history?&id=541+M0040&cl=02
## 3225   http://ntusweety.herokuapp.com/history?&id=541+M0230&cl=
## 3226   http://ntusweety.herokuapp.com/history?&id=541+M0440&cl=
## 3227   http://ntusweety.herokuapp.com/history?&id=541+M0450&cl=
## 3228   http://ntusweety.herokuapp.com/history?&id=541+M0490&cl=
## 3229   http://ntusweety.herokuapp.com/history?&id=541+M0500&cl=
## 3230   http://ntusweety.herokuapp.com/history?&id=541+M0600&cl=
## 3231   http://ntusweety.herokuapp.com/history?&id=541EM0720&cl=
## 3232   http://ntusweety.herokuapp.com/history?&id=541+M1050&cl=
## 3233   http://ntusweety.herokuapp.com/history?&id=541+M1210&cl=
## 3234   http://ntusweety.herokuapp.com/history?&id=541+M1360&cl=
## 3235   http://ntusweety.herokuapp.com/history?&id=541+M1740&cl=
## 3236   http://ntusweety.herokuapp.com/history?&id=543+D0010&cl=
## 3237   http://ntusweety.herokuapp.com/history?&id=543+D0040&cl=
## 3238   http://ntusweety.herokuapp.com/history?&id=543+M0010&cl=
## 3239 http://ntusweety.herokuapp.com/history?&id=543+M0020&cl=01
## 3240 http://ntusweety.herokuapp.com/history?&id=543+M0020&cl=02
## 3241 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=01
## 3242 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=02
## 3243 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=03
## 3244 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=04
## 3245 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=05
## 3246 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=06
## 3247 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=07
## 3248 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=08
## 3249 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=09
## 3250 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=10
## 3251 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=11
## 3252 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=12
## 3253 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=13
## 3254 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=14
## 3255 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=15
## 3256 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=16
## 3257 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=17
## 3258 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=18
## 3259 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=19
## 3260 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=20
## 3261 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=21
## 3262 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=22
## 3263 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=23
## 3264 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=24
## 3265 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=25
## 3266 http://ntusweety.herokuapp.com/history?&id=543+M0070&cl=26
## 3267   http://ntusweety.herokuapp.com/history?&id=543EM1020&cl=
## 3268   http://ntusweety.herokuapp.com/history?&id=543EM1110&cl=
## 3269 http://ntusweety.herokuapp.com/history?&id=543+M3010&cl=01
## 3270 http://ntusweety.herokuapp.com/history?&id=543+M3010&cl=02
## 3271 http://ntusweety.herokuapp.com/history?&id=543+M3020&cl=01
## 3272 http://ntusweety.herokuapp.com/history?&id=543+M3020&cl=02
## 3273 http://ntusweety.herokuapp.com/history?&id=543+M3020&cl=03
## 3274   http://ntusweety.herokuapp.com/history?&id=543+M3030&cl=
## 3275   http://ntusweety.herokuapp.com/history?&id=543EM4010&cl=
## 3276   http://ntusweety.herokuapp.com/history?&id=543+M4570&cl=
## 3277   http://ntusweety.herokuapp.com/history?&id=543+M4670&cl=
## 3278   http://ntusweety.herokuapp.com/history?&id=543+M4730&cl=
## 3279   http://ntusweety.herokuapp.com/history?&id=543EM5110&cl=
## 3280   http://ntusweety.herokuapp.com/history?&id=543+M5160&cl=
## 3281   http://ntusweety.herokuapp.com/history?&id=543+M5270&cl=
## 3282   http://ntusweety.herokuapp.com/history?&id=543EM5310&cl=
## 3283   http://ntusweety.herokuapp.com/history?&id=543+M5790&cl=
## 3284   http://ntusweety.herokuapp.com/history?&id=543EM6110&cl=
## 3285   http://ntusweety.herokuapp.com/history?&id=543EM6230&cl=
## 3286   http://ntusweety.herokuapp.com/history?&id=543+U4950&cl=
## 3287   http://ntusweety.herokuapp.com/history?&id=543+U5220&cl=
## 3288   http://ntusweety.herokuapp.com/history?&id=543+U5460&cl=
## 3289   http://ntusweety.herokuapp.com/history?&id=543+U5870&cl=
## 3290   http://ntusweety.herokuapp.com/history?&id=543+U6970&cl=
## 3291   http://ntusweety.herokuapp.com/history?&id=543+U6980&cl=
## 3292   http://ntusweety.herokuapp.com/history?&id=544+D0010&cl=
## 3293   http://ntusweety.herokuapp.com/history?&id=544+D1000&cl=
## 3294   http://ntusweety.herokuapp.com/history?&id=544+M0010&cl=
## 3295   http://ntusweety.herokuapp.com/history?&id=544+M0020&cl=
## 3296 http://ntusweety.herokuapp.com/history?&id=544+M0382&cl=01
## 3297 http://ntusweety.herokuapp.com/history?&id=544+M0382&cl=02
## 3298 http://ntusweety.herokuapp.com/history?&id=544+M0382&cl=03
## 3299   http://ntusweety.herokuapp.com/history?&id=544+M3090&cl=
## 3300   http://ntusweety.herokuapp.com/history?&id=544+M3850&cl=
## 3301   http://ntusweety.herokuapp.com/history?&id=544+M4360&cl=
## 3302   http://ntusweety.herokuapp.com/history?&id=544+M4370&cl=
## 3303   http://ntusweety.herokuapp.com/history?&id=544+M4520&cl=
## 3304   http://ntusweety.herokuapp.com/history?&id=544+U1790&cl=
## 3305   http://ntusweety.herokuapp.com/history?&id=546+D0010&cl=
## 3306 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=01
## 3307 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=02
## 3308 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=03
## 3309 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=04
## 3310 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=06
## 3311 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=07
## 3312 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=08
## 3313 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=12
## 3314 http://ntusweety.herokuapp.com/history?&id=546+D0070&cl=14
## 3315   http://ntusweety.herokuapp.com/history?&id=546+M0010&cl=
## 3316 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=01
## 3317 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=02
## 3318 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=03
## 3319 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=04
## 3320 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=06
## 3321 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=09
## 3322 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=11
## 3323 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=13
## 3324 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=14
## 3325 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=15
## 3326 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=16
## 3327 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=17
## 3328 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=18
## 3329 http://ntusweety.herokuapp.com/history?&id=546+M0070&cl=19
## 3330   http://ntusweety.herokuapp.com/history?&id=546+M0080&cl=
## 3331   http://ntusweety.herokuapp.com/history?&id=546+M0090&cl=
## 3332   http://ntusweety.herokuapp.com/history?&id=546+M6010&cl=
## 3333   http://ntusweety.herokuapp.com/history?&id=546+M6040&cl=
## 3334   http://ntusweety.herokuapp.com/history?&id=546+U3210&cl=
## 3335   http://ntusweety.herokuapp.com/history?&id=546+U6130&cl=
## 3336   http://ntusweety.herokuapp.com/history?&id=548+D0010&cl=
## 3337 http://ntusweety.herokuapp.com/history?&id=548ED0020&cl=01
## 3338 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=02
## 3339 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=03
## 3340 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=04
## 3341 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=05
## 3342 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=06
## 3343 http://ntusweety.herokuapp.com/history?&id=548ED0020&cl=07
## 3344 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=08
## 3345 http://ntusweety.herokuapp.com/history?&id=548ED0020&cl=09
## 3346 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=10
## 3347 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=11
## 3348 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=12
## 3349 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=13
## 3350 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=14
## 3351 http://ntusweety.herokuapp.com/history?&id=548+D0020&cl=15
## 3352   http://ntusweety.herokuapp.com/history?&id=548+D0030&cl=
## 3353   http://ntusweety.herokuapp.com/history?&id=548+M0010&cl=
## 3354 http://ntusweety.herokuapp.com/history?&id=548EM0040&cl=01
## 3355 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=02
## 3356 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=03
## 3357 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=04
## 3358 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=05
## 3359 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=06
## 3360 http://ntusweety.herokuapp.com/history?&id=548EM0040&cl=07
## 3361 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=08
## 3362 http://ntusweety.herokuapp.com/history?&id=548EM0040&cl=09
## 3363 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=10
## 3364 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=11
## 3365 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=12
## 3366 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=13
## 3367 http://ntusweety.herokuapp.com/history?&id=548+M0040&cl=14
## 3368 http://ntusweety.herokuapp.com/history?&id=548EM0040&cl=15
## 3369   http://ntusweety.herokuapp.com/history?&id=548+M0050&cl=
## 3370   http://ntusweety.herokuapp.com/history?&id=548+M0140&cl=
## 3371   http://ntusweety.herokuapp.com/history?&id=548+M0430&cl=
## 3372   http://ntusweety.herokuapp.com/history?&id=548+M0540&cl=
## 3373   http://ntusweety.herokuapp.com/history?&id=548+M0552&cl=
## 3374   http://ntusweety.herokuapp.com/history?&id=548EM0650&cl=
## 3375   http://ntusweety.herokuapp.com/history?&id=548+M0850&cl=
## 3376   http://ntusweety.herokuapp.com/history?&id=548+M0870&cl=
## 3377   http://ntusweety.herokuapp.com/history?&id=548EM0910&cl=
## 3378   http://ntusweety.herokuapp.com/history?&id=548+M0982&cl=
## 3379   http://ntusweety.herokuapp.com/history?&id=548+M0990&cl=
## 3380   http://ntusweety.herokuapp.com/history?&id=548+M1250&cl=
## 3381   http://ntusweety.herokuapp.com/history?&id=548+M1260&cl=
## 3382   http://ntusweety.herokuapp.com/history?&id=548+M1270&cl=
## 3383   http://ntusweety.herokuapp.com/history?&id=548+M1350&cl=
## 3384   http://ntusweety.herokuapp.com/history?&id=548+M1440&cl=
## 3385   http://ntusweety.herokuapp.com/history?&id=548+M1450&cl=
## 3386   http://ntusweety.herokuapp.com/history?&id=548+M1630&cl=
## 3387   http://ntusweety.herokuapp.com/history?&id=548+M1700&cl=
## 3388   http://ntusweety.herokuapp.com/history?&id=548EU0110&cl=
## 3389   http://ntusweety.herokuapp.com/history?&id=549+D0010&cl=
## 3390 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=01
## 3391 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=02
## 3392 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=04
## 3393 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=05
## 3394 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=06
## 3395 http://ntusweety.herokuapp.com/history?&id=549+D6020&cl=08
## 3396 http://ntusweety.herokuapp.com/history?&id=549+D6040&cl=01
## 3397 http://ntusweety.herokuapp.com/history?&id=549+D6040&cl=04
## 3398 http://ntusweety.herokuapp.com/history?&id=549+D6040&cl=05
## 3399 http://ntusweety.herokuapp.com/history?&id=549+D6040&cl=06
## 3400   http://ntusweety.herokuapp.com/history?&id=549+M0010&cl=
## 3401   http://ntusweety.herokuapp.com/history?&id=549+M0020&cl=
## 3402   http://ntusweety.herokuapp.com/history?&id=549+M1030&cl=
## 3403   http://ntusweety.herokuapp.com/history?&id=549+M1050&cl=
## 3404   http://ntusweety.herokuapp.com/history?&id=549+M1121&cl=
## 3405   http://ntusweety.herokuapp.com/history?&id=549+M2010&cl=
## 3406   http://ntusweety.herokuapp.com/history?&id=549+M3120&cl=
## 3407   http://ntusweety.herokuapp.com/history?&id=549+M4010&cl=
## 3408   http://ntusweety.herokuapp.com/history?&id=549+M4030&cl=
## 3409 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=02
## 3410 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=03
## 3411 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=04
## 3412 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=05
## 3413 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=06
## 3414 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=07
## 3415 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=08
## 3416 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=09
## 3417 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=10
## 3418 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=12
## 3419 http://ntusweety.herokuapp.com/history?&id=549+M5020&cl=13
## 3420 http://ntusweety.herokuapp.com/history?&id=549+M5030&cl=01
## 3421 http://ntusweety.herokuapp.com/history?&id=549+M5030&cl=04
## 3422   http://ntusweety.herokuapp.com/history?&id=601+10200&cl=
## 3423 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=01
## 3424 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=02
## 3425 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=03
## 3426 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=04
## 3427 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=05
## 3428 http://ntusweety.herokuapp.com/history?&id=601+10810&cl=06
## 3429 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=01
## 3430 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=02
## 3431 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=03
## 3432 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=04
## 3433 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=05
## 3434 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=06
## 3435 http://ntusweety.herokuapp.com/history?&id=601+10820&cl=07
## 3436 http://ntusweety.herokuapp.com/history?&id=601+10910&cl=01
## 3437 http://ntusweety.herokuapp.com/history?&id=601+10910&cl=02
## 3438 http://ntusweety.herokuapp.com/history?&id=601+10910&cl=03
## 3439 http://ntusweety.herokuapp.com/history?&id=601+10910&cl=06
## 3440 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=01
## 3441 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=02
## 3442 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=03
## 3443 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=04
## 3444 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=05
## 3445 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=06
## 3446 http://ntusweety.herokuapp.com/history?&id=601+10920&cl=07
## 3447   http://ntusweety.herokuapp.com/history?&id=601+20000&cl=
## 3448 http://ntusweety.herokuapp.com/history?&id=601+20020&cl=01
## 3449 http://ntusweety.herokuapp.com/history?&id=601+20020&cl=02
## 3450   http://ntusweety.herokuapp.com/history?&id=601+202A0&cl=
## 3451 http://ntusweety.herokuapp.com/history?&id=601+23200&cl=01
## 3452 http://ntusweety.herokuapp.com/history?&id=601+23200&cl=02
## 3453   http://ntusweety.herokuapp.com/history?&id=601+30210&cl=
## 3454   http://ntusweety.herokuapp.com/history?&id=601+30320&cl=
## 3455   http://ntusweety.herokuapp.com/history?&id=601+33700&cl=
## 3456   http://ntusweety.herokuapp.com/history?&id=601+49101&cl=
## 3457   http://ntusweety.herokuapp.com/history?&id=601+49102&cl=
## 3458   http://ntusweety.herokuapp.com/history?&id=602+20320&cl=
## 3459   http://ntusweety.herokuapp.com/history?&id=602+21400&cl=
## 3460 http://ntusweety.herokuapp.com/history?&id=602+22800&cl=01
## 3461 http://ntusweety.herokuapp.com/history?&id=602+22800&cl=02
## 3462 http://ntusweety.herokuapp.com/history?&id=602+24300&cl=01
## 3463 http://ntusweety.herokuapp.com/history?&id=602+24300&cl=02
## 3464   http://ntusweety.herokuapp.com/history?&id=602+27500&cl=
## 3465   http://ntusweety.herokuapp.com/history?&id=602+27600&cl=
## 3466   http://ntusweety.herokuapp.com/history?&id=602E27800&cl=
## 3467 http://ntusweety.herokuapp.com/history?&id=602+31500&cl=01
## 3468 http://ntusweety.herokuapp.com/history?&id=602+31500&cl=02
## 3469 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=01
## 3470 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=03
## 3471 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=11
## 3472 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=12
## 3473 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=14
## 3474 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=17
## 3475 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=18
## 3476 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=19
## 3477 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=21
## 3478 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=22
## 3479 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=23
## 3480 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=24
## 3481 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=25
## 3482 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=26
## 3483 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=27
## 3484 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=28
## 3485 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=29
## 3486 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=30
## 3487 http://ntusweety.herokuapp.com/history?&id=602+41720&cl=31
## 3488   http://ntusweety.herokuapp.com/history?&id=603+23100&cl=
## 3489 http://ntusweety.herokuapp.com/history?&id=603+23200&cl=01
## 3490 http://ntusweety.herokuapp.com/history?&id=603+23200&cl=02
## 3491   http://ntusweety.herokuapp.com/history?&id=603+30100&cl=
## 3492   http://ntusweety.herokuapp.com/history?&id=603+35720&cl=
## 3493   http://ntusweety.herokuapp.com/history?&id=603+39100&cl=
## 3494 http://ntusweety.herokuapp.com/history?&id=603+39200&cl=01
## 3495 http://ntusweety.herokuapp.com/history?&id=603+39200&cl=02
## 3496   http://ntusweety.herokuapp.com/history?&id=603+49102&cl=
## 3497 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=01
## 3498 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=02
## 3499 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=03
## 3500 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=04
## 3501 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=05
## 3502 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=06
## 3503 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=08
## 3504 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=09
## 3505 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=10
## 3506 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=12
## 3507 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=13
## 3508 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=14
## 3509 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=15
## 3510 http://ntusweety.herokuapp.com/history?&id=603+49620&cl=16
## 3511 http://ntusweety.herokuapp.com/history?&id=605+10200&cl=01
## 3512 http://ntusweety.herokuapp.com/history?&id=605+10200&cl=02
## 3513   http://ntusweety.herokuapp.com/history?&id=605+21300&cl=
## 3514   http://ntusweety.herokuapp.com/history?&id=605+30320&cl=
## 3515   http://ntusweety.herokuapp.com/history?&id=605+30350&cl=
## 3516   http://ntusweety.herokuapp.com/history?&id=605+39300&cl=
## 3517 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=01
## 3518 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=02
## 3519 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=03
## 3520 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=04
## 3521 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=05
## 3522 http://ntusweety.herokuapp.com/history?&id=605+39460&cl=06
## 3523   http://ntusweety.herokuapp.com/history?&id=605+40360&cl=
## 3524   http://ntusweety.herokuapp.com/history?&id=605+40800&cl=
## 3525   http://ntusweety.herokuapp.com/history?&id=605+43130&cl=
## 3526   http://ntusweety.herokuapp.com/history?&id=605+43300&cl=
## 3527 http://ntusweety.herokuapp.com/history?&id=605+49102&cl=01
## 3528 http://ntusweety.herokuapp.com/history?&id=605+49102&cl=02
## 3529 http://ntusweety.herokuapp.com/history?&id=605+49102&cl=03
## 3530 http://ntusweety.herokuapp.com/history?&id=605+49102&cl=04
## 3531 http://ntusweety.herokuapp.com/history?&id=605+49102&cl=05
## 3532 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=56
## 3533 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=57
## 3534 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=58
## 3535 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=59
## 3536 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=60
## 3537 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=62
## 3538 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=64
## 3539 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=70
## 3540 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=71
## 3541 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=74
## 3542 http://ntusweety.herokuapp.com/history?&id=605+49502&cl=75
## 3543   http://ntusweety.herokuapp.com/history?&id=605+49570&cl=
## 3544   http://ntusweety.herokuapp.com/history?&id=606+20000&cl=
## 3545   http://ntusweety.herokuapp.com/history?&id=606+21000&cl=
## 3546   http://ntusweety.herokuapp.com/history?&id=606+252A0&cl=
## 3547   http://ntusweety.herokuapp.com/history?&id=606+25400&cl=
## 3548   http://ntusweety.herokuapp.com/history?&id=606+33800&cl=
## 3549 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=02
## 3550 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=04
## 3551 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=05
## 3552 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=06
## 3553 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=07
## 3554 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=08
## 3555 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=09
## 3556 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=10
## 3557 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=11
## 3558 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=12
## 3559 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=13
## 3560 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=14
## 3561 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=15
## 3562 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=16
## 3563 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=17
## 3564 http://ntusweety.herokuapp.com/history?&id=606+49000&cl=18
## 3565 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=02
## 3566 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=03
## 3567 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=04
## 3568 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=05
## 3569 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=06
## 3570 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=07
## 3571 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=08
## 3572 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=09
## 3573 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=10
## 3574 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=11
## 3575 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=12
## 3576 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=13
## 3577 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=14
## 3578 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=16
## 3579 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=17
## 3580 http://ntusweety.herokuapp.com/history?&id=606+49102&cl=18
## 3581   http://ntusweety.herokuapp.com/history?&id=606+61022&cl=
## 3582   http://ntusweety.herokuapp.com/history?&id=606+61302&cl=
## 3583   http://ntusweety.herokuapp.com/history?&id=606+62050&cl=
## 3584   http://ntusweety.herokuapp.com/history?&id=606+62070&cl=
## 3585   http://ntusweety.herokuapp.com/history?&id=606+63050&cl=
## 3586   http://ntusweety.herokuapp.com/history?&id=606+63060&cl=
## 3587   http://ntusweety.herokuapp.com/history?&id=606+63090&cl=
## 3588   http://ntusweety.herokuapp.com/history?&id=606+63100&cl=
## 3589   http://ntusweety.herokuapp.com/history?&id=606+64050&cl=
## 3590   http://ntusweety.herokuapp.com/history?&id=606+64060&cl=
## 3591   http://ntusweety.herokuapp.com/history?&id=606+64070&cl=
## 3592   http://ntusweety.herokuapp.com/history?&id=606+64090&cl=
## 3593   http://ntusweety.herokuapp.com/history?&id=606+64110&cl=
## 3594   http://ntusweety.herokuapp.com/history?&id=607+10202&cl=
## 3595   http://ntusweety.herokuapp.com/history?&id=607+20012&cl=
## 3596   http://ntusweety.herokuapp.com/history?&id=607+263A2&cl=
## 3597   http://ntusweety.herokuapp.com/history?&id=607+264A2&cl=
## 3598   http://ntusweety.herokuapp.com/history?&id=607+30100&cl=
## 3599   http://ntusweety.herokuapp.com/history?&id=607+32100&cl=
## 3600   http://ntusweety.herokuapp.com/history?&id=607+32700&cl=
## 3601   http://ntusweety.herokuapp.com/history?&id=607+33200&cl=
## 3602   http://ntusweety.herokuapp.com/history?&id=607+45100&cl=
## 3603   http://ntusweety.herokuapp.com/history?&id=607+45400&cl=
## 3604   http://ntusweety.herokuapp.com/history?&id=607+49420&cl=
## 3605   http://ntusweety.herokuapp.com/history?&id=607+51000&cl=
## 3606   http://ntusweety.herokuapp.com/history?&id=608+10320&cl=
## 3607   http://ntusweety.herokuapp.com/history?&id=608+10330&cl=
## 3608   http://ntusweety.herokuapp.com/history?&id=608+10340&cl=
## 3609   http://ntusweety.herokuapp.com/history?&id=608+10350&cl=
## 3610   http://ntusweety.herokuapp.com/history?&id=608+10360&cl=
## 3611   http://ntusweety.herokuapp.com/history?&id=608+20260&cl=
## 3612   http://ntusweety.herokuapp.com/history?&id=608+26670&cl=
## 3613   http://ntusweety.herokuapp.com/history?&id=608+27700&cl=
## 3614   http://ntusweety.herokuapp.com/history?&id=608+27900&cl=
## 3615   http://ntusweety.herokuapp.com/history?&id=608+28100&cl=
## 3616   http://ntusweety.herokuapp.com/history?&id=608E31320&cl=
## 3617   http://ntusweety.herokuapp.com/history?&id=608+37900&cl=
## 3618   http://ntusweety.herokuapp.com/history?&id=608+41120&cl=
## 3619   http://ntusweety.herokuapp.com/history?&id=608+46800&cl=
## 3620   http://ntusweety.herokuapp.com/history?&id=608+47200&cl=
## 3621   http://ntusweety.herokuapp.com/history?&id=608+47300&cl=
## 3622 http://ntusweety.herokuapp.com/history?&id=608+49102&cl=01
## 3623 http://ntusweety.herokuapp.com/history?&id=608+49102&cl=02
## 3624 http://ntusweety.herokuapp.com/history?&id=608+49402&cl=02
## 3625 http://ntusweety.herokuapp.com/history?&id=608+49402&cl=03
## 3626 http://ntusweety.herokuapp.com/history?&id=608+49402&cl=04
## 3627 http://ntusweety.herokuapp.com/history?&id=608+49402&cl=05
## 3628 http://ntusweety.herokuapp.com/history?&id=608+49502&cl=12
## 3629 http://ntusweety.herokuapp.com/history?&id=608+49502&cl=13
## 3630 http://ntusweety.herokuapp.com/history?&id=608+49502&cl=14
## 3631 http://ntusweety.herokuapp.com/history?&id=608+49502&cl=16
## 3632 http://ntusweety.herokuapp.com/history?&id=608+49502&cl=20
## 3633 http://ntusweety.herokuapp.com/history?&id=609+21500&cl=01
## 3634 http://ntusweety.herokuapp.com/history?&id=609+21500&cl=02
## 3635 http://ntusweety.herokuapp.com/history?&id=609+21600&cl=01
## 3636 http://ntusweety.herokuapp.com/history?&id=609+21600&cl=02
## 3637 http://ntusweety.herokuapp.com/history?&id=609+21902&cl=01
## 3638 http://ntusweety.herokuapp.com/history?&id=609+21902&cl=02
## 3639 http://ntusweety.herokuapp.com/history?&id=609+29702&cl=01
## 3640 http://ntusweety.herokuapp.com/history?&id=609+29702&cl=02
## 3641 http://ntusweety.herokuapp.com/history?&id=609+29800&cl=01
## 3642 http://ntusweety.herokuapp.com/history?&id=609+29800&cl=02
## 3643 http://ntusweety.herokuapp.com/history?&id=609+30102&cl=01
## 3644 http://ntusweety.herokuapp.com/history?&id=609+30102&cl=02
## 3645 http://ntusweety.herokuapp.com/history?&id=609+30400&cl=01
## 3646 http://ntusweety.herokuapp.com/history?&id=609+30400&cl=02
## 3647 http://ntusweety.herokuapp.com/history?&id=609+31200&cl=01
## 3648 http://ntusweety.herokuapp.com/history?&id=609+31200&cl=02
## 3649 http://ntusweety.herokuapp.com/history?&id=609+33400&cl=01
## 3650 http://ntusweety.herokuapp.com/history?&id=609+33400&cl=02
## 3651   http://ntusweety.herokuapp.com/history?&id=609+33850&cl=
## 3652 http://ntusweety.herokuapp.com/history?&id=609+34000&cl=01
## 3653 http://ntusweety.herokuapp.com/history?&id=609+34000&cl=02
## 3654 http://ntusweety.herokuapp.com/history?&id=609+40200&cl=01
## 3655 http://ntusweety.herokuapp.com/history?&id=609+40200&cl=02
## 3656 http://ntusweety.herokuapp.com/history?&id=609+40300&cl=01
## 3657 http://ntusweety.herokuapp.com/history?&id=609+40300&cl=02
## 3658 http://ntusweety.herokuapp.com/history?&id=609+40650&cl=01
## 3659 http://ntusweety.herokuapp.com/history?&id=609+40650&cl=02
## 3660   http://ntusweety.herokuapp.com/history?&id=609+44410&cl=
## 3661   http://ntusweety.herokuapp.com/history?&id=609+45210&cl=
## 3662 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=08
## 3663 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=20
## 3664 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=22
## 3665 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=23
## 3666 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=28
## 3667 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=30
## 3668 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=32
## 3669 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=34
## 3670 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=35
## 3671 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=36
## 3672 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=42
## 3673 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=43
## 3674 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=44
## 3675 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=45
## 3676 http://ntusweety.herokuapp.com/history?&id=609+48502&cl=46
## 3677   http://ntusweety.herokuapp.com/history?&id=609+52400&cl=
## 3678 http://ntusweety.herokuapp.com/history?&id=609+55020&cl=01
## 3679 http://ntusweety.herokuapp.com/history?&id=609+55020&cl=02
## 3680 http://ntusweety.herokuapp.com/history?&id=609+55320&cl=01
## 3681 http://ntusweety.herokuapp.com/history?&id=609+55320&cl=02
## 3682 http://ntusweety.herokuapp.com/history?&id=609+56020&cl=01
## 3683 http://ntusweety.herokuapp.com/history?&id=609+56020&cl=02
## 3684   http://ntusweety.herokuapp.com/history?&id=609+56300&cl=
## 3685   http://ntusweety.herokuapp.com/history?&id=609+59500&cl=
## 3686 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=22
## 3687 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=34
## 3688 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=35
## 3689 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=36
## 3690 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=42
## 3691 http://ntusweety.herokuapp.com/history?&id=609+59502&cl=43
## 3692   http://ntusweety.herokuapp.com/history?&id=609+59510&cl=
## 3693   http://ntusweety.herokuapp.com/history?&id=610+29610&cl=
## 3694   http://ntusweety.herokuapp.com/history?&id=610+38840&cl=
## 3695 http://ntusweety.herokuapp.com/history?&id=610+41300&cl=01
## 3696 http://ntusweety.herokuapp.com/history?&id=610+41300&cl=03
## 3697   http://ntusweety.herokuapp.com/history?&id=610+50060&cl=
## 3698   http://ntusweety.herokuapp.com/history?&id=610+50100&cl=
## 3699   http://ntusweety.herokuapp.com/history?&id=611+10600&cl=
## 3700   http://ntusweety.herokuapp.com/history?&id=611+17100&cl=
## 3701   http://ntusweety.herokuapp.com/history?&id=611+21220&cl=
## 3702   http://ntusweety.herokuapp.com/history?&id=611+22410&cl=
## 3703   http://ntusweety.herokuapp.com/history?&id=611+22500&cl=
## 3704   http://ntusweety.herokuapp.com/history?&id=611+25510&cl=
## 3705 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=01
## 3706 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=02
## 3707 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=03
## 3708 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=04
## 3709 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=05
## 3710 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=06
## 3711 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=07
## 3712 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=08
## 3713 http://ntusweety.herokuapp.com/history?&id=611+31200&cl=09
## 3714   http://ntusweety.herokuapp.com/history?&id=611+32600&cl=
## 3715   http://ntusweety.herokuapp.com/history?&id=611+34710&cl=
## 3716   http://ntusweety.herokuapp.com/history?&id=611+36480&cl=
## 3717   http://ntusweety.herokuapp.com/history?&id=611+37400&cl=
## 3718 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=06
## 3719 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=07
## 3720 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=08
## 3721 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=10
## 3722 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=11
## 3723 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=12
## 3724 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=13
## 3725 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=15
## 3726 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=16
## 3727 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=17
## 3728 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=18
## 3729 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=19
## 3730 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=20
## 3731 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=21
## 3732 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=22
## 3733 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=23
## 3734 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=24
## 3735 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=25
## 3736 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=26
## 3737 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=27
## 3738 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=28
## 3739 http://ntusweety.herokuapp.com/history?&id=611+49100&cl=29
## 3740 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=06
## 3741 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=07
## 3742 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=08
## 3743 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=10
## 3744 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=12
## 3745 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=13
## 3746 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=15
## 3747 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=16
## 3748 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=17
## 3749 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=18
## 3750 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=19
## 3751 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=20
## 3752 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=21
## 3753 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=22
## 3754 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=23
## 3755 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=24
## 3756 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=25
## 3757 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=26
## 3758 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=27
## 3759 http://ntusweety.herokuapp.com/history?&id=611+49220&cl=28
## 3760   http://ntusweety.herokuapp.com/history?&id=612+10102&cl=
## 3761   http://ntusweety.herokuapp.com/history?&id=612+10202&cl=
## 3762   http://ntusweety.herokuapp.com/history?&id=612+21800&cl=
## 3763   http://ntusweety.herokuapp.com/history?&id=612+30100&cl=
## 3764   http://ntusweety.herokuapp.com/history?&id=612+30300&cl=
## 3765   http://ntusweety.herokuapp.com/history?&id=612+30600&cl=
## 3766   http://ntusweety.herokuapp.com/history?&id=612+32102&cl=
## 3767   http://ntusweety.herokuapp.com/history?&id=612+32202&cl=
## 3768   http://ntusweety.herokuapp.com/history?&id=612+341A0&cl=
## 3769   http://ntusweety.herokuapp.com/history?&id=612+44100&cl=
## 3770   http://ntusweety.herokuapp.com/history?&id=612+44200&cl=
## 3771 http://ntusweety.herokuapp.com/history?&id=612+49200&cl=02
## 3772 http://ntusweety.herokuapp.com/history?&id=612+49200&cl=03
## 3773 http://ntusweety.herokuapp.com/history?&id=612+49200&cl=06
## 3774 http://ntusweety.herokuapp.com/history?&id=612+49200&cl=07
## 3775 http://ntusweety.herokuapp.com/history?&id=612E49200&cl=08
## 3776 http://ntusweety.herokuapp.com/history?&id=612+49200&cl=10
## 3777 http://ntusweety.herokuapp.com/history?&id=612+49502&cl=01
## 3778 http://ntusweety.herokuapp.com/history?&id=612+49502&cl=06
## 3779 http://ntusweety.herokuapp.com/history?&id=612+49502&cl=07
## 3780 http://ntusweety.herokuapp.com/history?&id=612E49502&cl=08
## 3781 http://ntusweety.herokuapp.com/history?&id=612+49502&cl=09
## 3782   http://ntusweety.herokuapp.com/history?&id=613+32700&cl=
## 3783   http://ntusweety.herokuapp.com/history?&id=613+40300&cl=
## 3784   http://ntusweety.herokuapp.com/history?&id=613+49950&cl=
## 3785   http://ntusweety.herokuapp.com/history?&id=613+49970&cl=
## 3786   http://ntusweety.herokuapp.com/history?&id=613+50000&cl=
## 3787   http://ntusweety.herokuapp.com/history?&id=613+50020&cl=
## 3788   http://ntusweety.herokuapp.com/history?&id=621+D0010&cl=
## 3789 http://ntusweety.herokuapp.com/history?&id=621+D0070&cl=01
## 3790 http://ntusweety.herokuapp.com/history?&id=621+D0070&cl=02
## 3791   http://ntusweety.herokuapp.com/history?&id=621+M0010&cl=
## 3792 http://ntusweety.herokuapp.com/history?&id=621+M0070&cl=01
## 3793 http://ntusweety.herokuapp.com/history?&id=621+M0070&cl=02
## 3794   http://ntusweety.herokuapp.com/history?&id=621+M1020&cl=
## 3795   http://ntusweety.herokuapp.com/history?&id=621+M1340&cl=
## 3796   http://ntusweety.herokuapp.com/history?&id=621+M2060&cl=
## 3797   http://ntusweety.herokuapp.com/history?&id=621+U1950&cl=
## 3798   http://ntusweety.herokuapp.com/history?&id=621+U4490&cl=
## 3799   http://ntusweety.herokuapp.com/history?&id=621+U5300&cl=
## 3800   http://ntusweety.herokuapp.com/history?&id=621+U5400&cl=
## 3801   http://ntusweety.herokuapp.com/history?&id=621+U6070&cl=
## 3802   http://ntusweety.herokuapp.com/history?&id=621+U6280&cl=
## 3803   http://ntusweety.herokuapp.com/history?&id=621+U6350&cl=
## 3804   http://ntusweety.herokuapp.com/history?&id=621+U6520&cl=
## 3805   http://ntusweety.herokuapp.com/history?&id=621+U6630&cl=
## 3806   http://ntusweety.herokuapp.com/history?&id=622+D0010&cl=
## 3807   http://ntusweety.herokuapp.com/history?&id=622+D0020&cl=
## 3808   http://ntusweety.herokuapp.com/history?&id=622+D0440&cl=
## 3809   http://ntusweety.herokuapp.com/history?&id=622+D0550&cl=
## 3810   http://ntusweety.herokuapp.com/history?&id=622+M0010&cl=
## 3811 http://ntusweety.herokuapp.com/history?&id=622+M0030&cl=01
## 3812 http://ntusweety.herokuapp.com/history?&id=622+M0030&cl=02
## 3813 http://ntusweety.herokuapp.com/history?&id=622+M0030&cl=03
## 3814 http://ntusweety.herokuapp.com/history?&id=622+M0030&cl=04
## 3815 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=01
## 3816 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=02
## 3817 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=03
## 3818 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=04
## 3819 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=05
## 3820 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=07
## 3821 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=08
## 3822 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=09
## 3823 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=10
## 3824 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=11
## 3825 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=13
## 3826 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=14
## 3827 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=15
## 3828 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=16
## 3829 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=17
## 3830 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=18
## 3831 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=19
## 3832 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=20
## 3833 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=21
## 3834 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=22
## 3835 http://ntusweety.herokuapp.com/history?&id=622+M1720&cl=23
## 3836   http://ntusweety.herokuapp.com/history?&id=622+U0380&cl=
## 3837   http://ntusweety.herokuapp.com/history?&id=622+U1060&cl=
## 3838   http://ntusweety.herokuapp.com/history?&id=622+U1750&cl=
## 3839   http://ntusweety.herokuapp.com/history?&id=622+U2210&cl=
## 3840   http://ntusweety.herokuapp.com/history?&id=622+U2240&cl=
## 3841   http://ntusweety.herokuapp.com/history?&id=622+U2630&cl=
## 3842   http://ntusweety.herokuapp.com/history?&id=622+U2770&cl=
## 3843   http://ntusweety.herokuapp.com/history?&id=622+U2840&cl=
## 3844   http://ntusweety.herokuapp.com/history?&id=622+U2940&cl=
## 3845   http://ntusweety.herokuapp.com/history?&id=622+U3300&cl=
## 3846   http://ntusweety.herokuapp.com/history?&id=622+U3400&cl=
## 3847   http://ntusweety.herokuapp.com/history?&id=622+U3600&cl=
## 3848   http://ntusweety.herokuapp.com/history?&id=622+U4500&cl=
## 3849   http://ntusweety.herokuapp.com/history?&id=622EU4730&cl=
## 3850   http://ntusweety.herokuapp.com/history?&id=622+U4920&cl=
## 3851   http://ntusweety.herokuapp.com/history?&id=623+D0010&cl=
## 3852 http://ntusweety.herokuapp.com/history?&id=623+D0030&cl=01
## 3853 http://ntusweety.herokuapp.com/history?&id=623+D0030&cl=02
## 3854 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=02
## 3855 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=04
## 3856 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=05
## 3857 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=06
## 3858 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=07
## 3859 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=08
## 3860 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=09
## 3861 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=10
## 3862 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=12
## 3863 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=14
## 3864 http://ntusweety.herokuapp.com/history?&id=623+D1020&cl=15
## 3865 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=02
## 3866 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=03
## 3867 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=04
## 3868 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=05
## 3869 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=06
## 3870 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=07
## 3871 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=08
## 3872 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=11
## 3873 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=12
## 3874 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=13
## 3875 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=14
## 3876 http://ntusweety.herokuapp.com/history?&id=623+D1040&cl=15
## 3877   http://ntusweety.herokuapp.com/history?&id=623+M0010&cl=
## 3878 http://ntusweety.herokuapp.com/history?&id=623+M0030&cl=01
## 3879 http://ntusweety.herokuapp.com/history?&id=623+M0030&cl=02
## 3880 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=01
## 3881 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=02
## 3882 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=03
## 3883 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=04
## 3884 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=05
## 3885 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=06
## 3886 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=07
## 3887 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=08
## 3888 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=09
## 3889 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=10
## 3890 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=11
## 3891 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=12
## 3892 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=13
## 3893 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=14
## 3894 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=15
## 3895 http://ntusweety.herokuapp.com/history?&id=623+M1020&cl=16
## 3896   http://ntusweety.herokuapp.com/history?&id=623+M1420&cl=
## 3897   http://ntusweety.herokuapp.com/history?&id=623+M1430&cl=
## 3898   http://ntusweety.herokuapp.com/history?&id=623+M2930&cl=
## 3899   http://ntusweety.herokuapp.com/history?&id=623+U0710&cl=
## 3900   http://ntusweety.herokuapp.com/history?&id=623+U2910&cl=
## 3901   http://ntusweety.herokuapp.com/history?&id=623+U3550&cl=
## 3902   http://ntusweety.herokuapp.com/history?&id=623+U4050&cl=
## 3903   http://ntusweety.herokuapp.com/history?&id=623+U4150&cl=
## 3904   http://ntusweety.herokuapp.com/history?&id=623+U4170&cl=
## 3905   http://ntusweety.herokuapp.com/history?&id=623+U4210&cl=
## 3906   http://ntusweety.herokuapp.com/history?&id=623+U4230&cl=
## 3907   http://ntusweety.herokuapp.com/history?&id=623+U4240&cl=
## 3908   http://ntusweety.herokuapp.com/history?&id=623+U4320&cl=
## 3909   http://ntusweety.herokuapp.com/history?&id=623+U4420&cl=
## 3910   http://ntusweety.herokuapp.com/history?&id=623+U4460&cl=
## 3911   http://ntusweety.herokuapp.com/history?&id=623+U4490&cl=
## 3912   http://ntusweety.herokuapp.com/history?&id=625+D0010&cl=
## 3913 http://ntusweety.herokuapp.com/history?&id=625+D0030&cl=50
## 3914 http://ntusweety.herokuapp.com/history?&id=625+D0030&cl=57
## 3915 http://ntusweety.herokuapp.com/history?&id=625+D0030&cl=59
## 3916 http://ntusweety.herokuapp.com/history?&id=625+D0030&cl=68
## 3917   http://ntusweety.herokuapp.com/history?&id=625+D1860&cl=
## 3918   http://ntusweety.herokuapp.com/history?&id=625+M0010&cl=
## 3919 http://ntusweety.herokuapp.com/history?&id=625+M0020&cl=01
## 3920 http://ntusweety.herokuapp.com/history?&id=625+M0020&cl=02
## 3921 http://ntusweety.herokuapp.com/history?&id=625+M0020&cl=03
## 3922 http://ntusweety.herokuapp.com/history?&id=625+M0020&cl=04
## 3923 http://ntusweety.herokuapp.com/history?&id=625+M0020&cl=05
## 3924 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=35
## 3925 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=44
## 3926 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=50
## 3927 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=54
## 3928 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=56
## 3929 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=57
## 3930 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=58
## 3931 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=59
## 3932 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=60
## 3933 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=62
## 3934 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=63
## 3935 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=64
## 3936 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=67
## 3937 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=68
## 3938 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=70
## 3939 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=71
## 3940 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=74
## 3941 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=75
## 3942 http://ntusweety.herokuapp.com/history?&id=625+M0120&cl=77
## 3943   http://ntusweety.herokuapp.com/history?&id=625+M1130&cl=
## 3944   http://ntusweety.herokuapp.com/history?&id=625+M1260&cl=
## 3945   http://ntusweety.herokuapp.com/history?&id=625+M1330&cl=
## 3946   http://ntusweety.herokuapp.com/history?&id=625+M1550&cl=
## 3947   http://ntusweety.herokuapp.com/history?&id=625+M1590&cl=
## 3948   http://ntusweety.herokuapp.com/history?&id=625+M2120&cl=
## 3949   http://ntusweety.herokuapp.com/history?&id=625EM2460&cl=
## 3950   http://ntusweety.herokuapp.com/history?&id=625+M2500&cl=
## 3951   http://ntusweety.herokuapp.com/history?&id=625+M2510&cl=
## 3952   http://ntusweety.herokuapp.com/history?&id=625+M2520&cl=
## 3953   http://ntusweety.herokuapp.com/history?&id=625+M2570&cl=
## 3954   http://ntusweety.herokuapp.com/history?&id=625EM2590&cl=
## 3955   http://ntusweety.herokuapp.com/history?&id=625+U1560&cl=
## 3956   http://ntusweety.herokuapp.com/history?&id=625+U1610&cl=
## 3957   http://ntusweety.herokuapp.com/history?&id=625+U1720&cl=
## 3958   http://ntusweety.herokuapp.com/history?&id=625+U1800&cl=
## 3959   http://ntusweety.herokuapp.com/history?&id=625+U1830&cl=
## 3960   http://ntusweety.herokuapp.com/history?&id=625EU1850&cl=
## 3961   http://ntusweety.herokuapp.com/history?&id=625+U1890&cl=
## 3962 http://ntusweety.herokuapp.com/history?&id=625EU1900&cl=01
## 3963 http://ntusweety.herokuapp.com/history?&id=625EU1900&cl=02
## 3964   http://ntusweety.herokuapp.com/history?&id=625EU1920&cl=
## 3965   http://ntusweety.herokuapp.com/history?&id=626+D0010&cl=
## 3966 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=01
## 3967 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=03
## 3968 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=04
## 3969 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=05
## 3970 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=06
## 3971 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=07
## 3972 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=08
## 3973 http://ntusweety.herokuapp.com/history?&id=626+D0030&cl=09
## 3974   http://ntusweety.herokuapp.com/history?&id=626+D0140&cl=
## 3975   http://ntusweety.herokuapp.com/history?&id=626+D1130&cl=
## 3976   http://ntusweety.herokuapp.com/history?&id=626+M0010&cl=
## 3977   http://ntusweety.herokuapp.com/history?&id=626+M1500&cl=
## 3978   http://ntusweety.herokuapp.com/history?&id=626+M1520&cl=
## 3979   http://ntusweety.herokuapp.com/history?&id=626+M1580&cl=
## 3980   http://ntusweety.herokuapp.com/history?&id=626+M1600&cl=
## 3981   http://ntusweety.herokuapp.com/history?&id=626+M1630&cl=
## 3982   http://ntusweety.herokuapp.com/history?&id=626+M1650&cl=
## 3983 http://ntusweety.herokuapp.com/history?&id=626+M6020&cl=01
## 3984 http://ntusweety.herokuapp.com/history?&id=626+M6030&cl=01
## 3985   http://ntusweety.herokuapp.com/history?&id=626+M6050&cl=
## 3986   http://ntusweety.herokuapp.com/history?&id=626+M60B0&cl=
## 3987   http://ntusweety.herokuapp.com/history?&id=626+U0220&cl=
## 3988   http://ntusweety.herokuapp.com/history?&id=627+D0010&cl=
## 3989   http://ntusweety.herokuapp.com/history?&id=627+D1720&cl=
## 3990   http://ntusweety.herokuapp.com/history?&id=627+D1810&cl=
## 3991   http://ntusweety.herokuapp.com/history?&id=627+M0010&cl=
## 3992   http://ntusweety.herokuapp.com/history?&id=627+M0040&cl=
## 3993   http://ntusweety.herokuapp.com/history?&id=627+M0220&cl=
## 3994   http://ntusweety.herokuapp.com/history?&id=627+M1660&cl=
## 3995   http://ntusweety.herokuapp.com/history?&id=627+M1670&cl=
## 3996   http://ntusweety.herokuapp.com/history?&id=627+M2800&cl=
## 3997   http://ntusweety.herokuapp.com/history?&id=627+M3120&cl=
## 3998   http://ntusweety.herokuapp.com/history?&id=627+M4510&cl=
## 3999   http://ntusweety.herokuapp.com/history?&id=627+M4560&cl=
## 4000   http://ntusweety.herokuapp.com/history?&id=627+M4600&cl=
## 4001 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=02
## 4002 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=03
## 4003 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=04
## 4004 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=05
## 4005 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=06
## 4006 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=07
## 4007 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=08
## 4008 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=09
## 4009 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=10
## 4010 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=11
## 4011 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=12
## 4012 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=13
## 4013 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=14
## 4014 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=15
## 4015 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=16
## 4016 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=17
## 4017 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=18
## 4018 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=19
## 4019 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=20
## 4020 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=22
## 4021 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=24
## 4022 http://ntusweety.herokuapp.com/history?&id=627+M4640&cl=25
## 4023   http://ntusweety.herokuapp.com/history?&id=627EM4670&cl=
## 4024   http://ntusweety.herokuapp.com/history?&id=627EM4680&cl=
## 4025   http://ntusweety.herokuapp.com/history?&id=627EM4750&cl=
## 4026   http://ntusweety.herokuapp.com/history?&id=627EM4830&cl=
## 4027   http://ntusweety.herokuapp.com/history?&id=627EM4860&cl=
## 4028   http://ntusweety.herokuapp.com/history?&id=627+M9500&cl=
## 4029   http://ntusweety.herokuapp.com/history?&id=627+U0020&cl=
## 4030   http://ntusweety.herokuapp.com/history?&id=627+U0080&cl=
## 4031   http://ntusweety.herokuapp.com/history?&id=627+U0720&cl=
## 4032   http://ntusweety.herokuapp.com/history?&id=627+U1010&cl=
## 4033 http://ntusweety.herokuapp.com/history?&id=627+U1150&cl=02
## 4034 http://ntusweety.herokuapp.com/history?&id=627+U1150&cl=03
## 4035 http://ntusweety.herokuapp.com/history?&id=627+U1150&cl=04
## 4036 http://ntusweety.herokuapp.com/history?&id=627+U1150&cl=05
## 4037 http://ntusweety.herokuapp.com/history?&id=627+U1150&cl=06
## 4038   http://ntusweety.herokuapp.com/history?&id=627+U1170&cl=
## 4039   http://ntusweety.herokuapp.com/history?&id=628+D0010&cl=
## 4040 http://ntusweety.herokuapp.com/history?&id=628+D0030&cl=01
## 4041 http://ntusweety.herokuapp.com/history?&id=628+D0030&cl=02
## 4042 http://ntusweety.herokuapp.com/history?&id=628+D0030&cl=03
## 4043 http://ntusweety.herokuapp.com/history?&id=628ED0040&cl=01
## 4044 http://ntusweety.herokuapp.com/history?&id=628ED0040&cl=02
## 4045 http://ntusweety.herokuapp.com/history?&id=628ED0040&cl=03
## 4046   http://ntusweety.herokuapp.com/history?&id=628+D1050&cl=
## 4047 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=01
## 4048 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=02
## 4049 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=03
## 4050 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=04
## 4051 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=05
## 4052 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=06
## 4053 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=07
## 4054 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=08
## 4055 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=09
## 4056 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=10
## 4057 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=12
## 4058 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=14
## 4059 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=17
## 4060 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=18
## 4061 http://ntusweety.herokuapp.com/history?&id=628+D1680&cl=19
## 4062 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=01
## 4063 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=02
## 4064 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=03
## 4065 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=04
## 4066 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=05
## 4067 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=08
## 4068 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=09
## 4069 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=11
## 4070 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=13
## 4071 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=14
## 4072 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=16
## 4073 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=17
## 4074 http://ntusweety.herokuapp.com/history?&id=628+D1700&cl=18
## 4075   http://ntusweety.herokuapp.com/history?&id=628+M0010&cl=
## 4076 http://ntusweety.herokuapp.com/history?&id=628+M0040&cl=01
## 4077 http://ntusweety.herokuapp.com/history?&id=628+M0040&cl=02
## 4078 http://ntusweety.herokuapp.com/history?&id=628+M0040&cl=03
## 4079 http://ntusweety.herokuapp.com/history?&id=628+M0040&cl=04
## 4080 http://ntusweety.herokuapp.com/history?&id=628+M0050&cl=01
## 4081 http://ntusweety.herokuapp.com/history?&id=628EM0050&cl=02
## 4082 http://ntusweety.herokuapp.com/history?&id=628+M0050&cl=03
## 4083 http://ntusweety.herokuapp.com/history?&id=628+M0050&cl=04
## 4084   http://ntusweety.herokuapp.com/history?&id=628+M1110&cl=
## 4085   http://ntusweety.herokuapp.com/history?&id=628+M1210&cl=
## 4086   http://ntusweety.herokuapp.com/history?&id=628+M1310&cl=
## 4087   http://ntusweety.herokuapp.com/history?&id=628+M1610&cl=
## 4088 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=01
## 4089 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=02
## 4090 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=03
## 4091 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=04
## 4092 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=05
## 4093 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=06
## 4094 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=07
## 4095 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=08
## 4096 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=09
## 4097 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=10
## 4098 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=11
## 4099 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=12
## 4100 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=13
## 4101 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=14
## 4102 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=15
## 4103 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=16
## 4104 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=17
## 4105 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=18
## 4106 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=19
## 4107 http://ntusweety.herokuapp.com/history?&id=628+M1850&cl=20
## 4108 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=01
## 4109 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=02
## 4110 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=03
## 4111 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=04
## 4112 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=05
## 4113 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=06
## 4114 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=07
## 4115 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=08
## 4116 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=09
## 4117 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=10
## 4118 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=11
## 4119 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=12
## 4120 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=13
## 4121 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=14
## 4122 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=15
## 4123 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=16
## 4124 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=17
## 4125 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=19
## 4126 http://ntusweety.herokuapp.com/history?&id=628+M1870&cl=20
## 4127   http://ntusweety.herokuapp.com/history?&id=628+M1890&cl=
## 4128   http://ntusweety.herokuapp.com/history?&id=628+M2040&cl=
## 4129   http://ntusweety.herokuapp.com/history?&id=628+M2140&cl=
## 4130   http://ntusweety.herokuapp.com/history?&id=628+M2150&cl=
## 4131   http://ntusweety.herokuapp.com/history?&id=628+U0740&cl=
## 4132   http://ntusweety.herokuapp.com/history?&id=628+U1040&cl=
## 4133   http://ntusweety.herokuapp.com/history?&id=628+U1190&cl=
## 4134   http://ntusweety.herokuapp.com/history?&id=628+U1530&cl=
## 4135   http://ntusweety.herokuapp.com/history?&id=628+U1580&cl=
## 4136   http://ntusweety.herokuapp.com/history?&id=628+U1640&cl=
## 4137   http://ntusweety.herokuapp.com/history?&id=628+U1810&cl=
## 4138   http://ntusweety.herokuapp.com/history?&id=628+U1850&cl=
## 4139   http://ntusweety.herokuapp.com/history?&id=628+U1920&cl=
## 4140   http://ntusweety.herokuapp.com/history?&id=628+U1950&cl=
## 4141   http://ntusweety.herokuapp.com/history?&id=628+U2020&cl=
## 4142   http://ntusweety.herokuapp.com/history?&id=628EU2070&cl=
## 4143   http://ntusweety.herokuapp.com/history?&id=629+D0010&cl=
## 4144   http://ntusweety.herokuapp.com/history?&id=629ED0040&cl=
## 4145   http://ntusweety.herokuapp.com/history?&id=629ED0060&cl=
## 4146 http://ntusweety.herokuapp.com/history?&id=629+D0080&cl=18
## 4147 http://ntusweety.herokuapp.com/history?&id=629+D0080&cl=28
## 4148 http://ntusweety.herokuapp.com/history?&id=629+D0080&cl=33
## 4149 http://ntusweety.herokuapp.com/history?&id=629+D0080&cl=36
## 4150 http://ntusweety.herokuapp.com/history?&id=629+D0080&cl=45
## 4151 http://ntusweety.herokuapp.com/history?&id=629+D0100&cl=33
## 4152   http://ntusweety.herokuapp.com/history?&id=629ED0120&cl=
## 4153   http://ntusweety.herokuapp.com/history?&id=629+M0010&cl=
## 4154 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=18
## 4155 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=21
## 4156 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=23
## 4157 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=33
## 4158 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=35
## 4159 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=36
## 4160 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=38
## 4161 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=40
## 4162 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=42
## 4163 http://ntusweety.herokuapp.com/history?&id=629+M0080&cl=45
## 4164 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=21
## 4165 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=33
## 4166 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=35
## 4167 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=36
## 4168 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=38
## 4169 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=40
## 4170 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=41
## 4171 http://ntusweety.herokuapp.com/history?&id=629+M0100&cl=42
## 4172   http://ntusweety.herokuapp.com/history?&id=629+M0160&cl=
## 4173   http://ntusweety.herokuapp.com/history?&id=629+M0180&cl=
## 4174   http://ntusweety.herokuapp.com/history?&id=629+M0280&cl=
## 4175   http://ntusweety.herokuapp.com/history?&id=629+M1412&cl=
## 4176   http://ntusweety.herokuapp.com/history?&id=629+M2600&cl=
## 4177   http://ntusweety.herokuapp.com/history?&id=629+M2610&cl=
## 4178   http://ntusweety.herokuapp.com/history?&id=629+U1520&cl=
## 4179   http://ntusweety.herokuapp.com/history?&id=629+U1840&cl=
## 4180   http://ntusweety.herokuapp.com/history?&id=629+U1990&cl=
## 4181   http://ntusweety.herokuapp.com/history?&id=629+U2000&cl=
## 4182   http://ntusweety.herokuapp.com/history?&id=629+U2480&cl=
## 4183   http://ntusweety.herokuapp.com/history?&id=629EU2490&cl=
## 4184   http://ntusweety.herokuapp.com/history?&id=629+U2610&cl=
## 4185   http://ntusweety.herokuapp.com/history?&id=629+U2630&cl=
## 4186   http://ntusweety.herokuapp.com/history?&id=629+U2640&cl=
## 4187   http://ntusweety.herokuapp.com/history?&id=629+U2680&cl=
## 4188   http://ntusweety.herokuapp.com/history?&id=629+U2710&cl=
## 4189   http://ntusweety.herokuapp.com/history?&id=630+D0010&cl=
## 4190   http://ntusweety.herokuapp.com/history?&id=630+D3040&cl=
## 4191   http://ntusweety.herokuapp.com/history?&id=630+M0010&cl=
## 4192   http://ntusweety.herokuapp.com/history?&id=630+M1020&cl=
## 4193   http://ntusweety.herokuapp.com/history?&id=630+M3060&cl=
## 4194   http://ntusweety.herokuapp.com/history?&id=630+M3210&cl=
## 4195   http://ntusweety.herokuapp.com/history?&id=630+M3230&cl=
## 4196   http://ntusweety.herokuapp.com/history?&id=630+M3240&cl=
## 4197   http://ntusweety.herokuapp.com/history?&id=630+M3310&cl=
## 4198   http://ntusweety.herokuapp.com/history?&id=630+U1750&cl=
## 4199   http://ntusweety.herokuapp.com/history?&id=630+U1860&cl=
## 4200   http://ntusweety.herokuapp.com/history?&id=631+D0010&cl=
## 4201   http://ntusweety.herokuapp.com/history?&id=631+D0030&cl=
## 4202 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=06
## 4203 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=07
## 4204 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=08
## 4205 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=11
## 4206 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=12
## 4207 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=13
## 4208 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=15
## 4209 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=16
## 4210 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=17
## 4211 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=18
## 4212 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=19
## 4213 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=20
## 4214 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=21
## 4215 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=24
## 4216 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=25
## 4217 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=26
## 4218 http://ntusweety.herokuapp.com/history?&id=631+D0040&cl=28
## 4219   http://ntusweety.herokuapp.com/history?&id=631+D5202&cl=
## 4220   http://ntusweety.herokuapp.com/history?&id=631+M0010&cl=
## 4221   http://ntusweety.herokuapp.com/history?&id=631+M0030&cl=
## 4222 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=06
## 4223 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=07
## 4224 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=08
## 4225 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=10
## 4226 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=11
## 4227 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=12
## 4228 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=13
## 4229 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=15
## 4230 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=16
## 4231 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=17
## 4232 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=18
## 4233 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=19
## 4234 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=20
## 4235 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=21
## 4236 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=22
## 4237 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=23
## 4238 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=24
## 4239 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=25
## 4240 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=26
## 4241 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=27
## 4242 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=28
## 4243 http://ntusweety.herokuapp.com/history?&id=631+M0040&cl=29
## 4244   http://ntusweety.herokuapp.com/history?&id=631+M1300&cl=
## 4245   http://ntusweety.herokuapp.com/history?&id=631+M3100&cl=
## 4246   http://ntusweety.herokuapp.com/history?&id=631+M3130&cl=
## 4247   http://ntusweety.herokuapp.com/history?&id=631+M3310&cl=
## 4248   http://ntusweety.herokuapp.com/history?&id=631+M5202&cl=
## 4249   http://ntusweety.herokuapp.com/history?&id=631+M7800&cl=
## 4250   http://ntusweety.herokuapp.com/history?&id=631+U1540&cl=
## 4251   http://ntusweety.herokuapp.com/history?&id=631EU1760&cl=
## 4252   http://ntusweety.herokuapp.com/history?&id=631+U1850&cl=
## 4253   http://ntusweety.herokuapp.com/history?&id=631+U7860&cl=
## 4254   http://ntusweety.herokuapp.com/history?&id=632+D0010&cl=
## 4255   http://ntusweety.herokuapp.com/history?&id=632ED0030&cl=
## 4256   http://ntusweety.herokuapp.com/history?&id=632+M0010&cl=
## 4257   http://ntusweety.herokuapp.com/history?&id=632EM0030&cl=
## 4258   http://ntusweety.herokuapp.com/history?&id=632+U0350&cl=
## 4259   http://ntusweety.herokuapp.com/history?&id=632+U0700&cl=
## 4260   http://ntusweety.herokuapp.com/history?&id=632EU0730&cl=
## 4261   http://ntusweety.herokuapp.com/history?&id=632+U1050&cl=
## 4262   http://ntusweety.herokuapp.com/history?&id=632+U1070&cl=
## 4263   http://ntusweety.herokuapp.com/history?&id=632+U1130&cl=
## 4264   http://ntusweety.herokuapp.com/history?&id=632EU1150&cl=
## 4265   http://ntusweety.herokuapp.com/history?&id=632+U1220&cl=
## 4266   http://ntusweety.herokuapp.com/history?&id=632+U1240&cl=
## 4267   http://ntusweety.herokuapp.com/history?&id=633+D0010&cl=
## 4268   http://ntusweety.herokuapp.com/history?&id=633ED0030&cl=
## 4269   http://ntusweety.herokuapp.com/history?&id=633+M0010&cl=
## 4270   http://ntusweety.herokuapp.com/history?&id=633+M0030&cl=
## 4271   http://ntusweety.herokuapp.com/history?&id=633+U0310&cl=
## 4272   http://ntusweety.herokuapp.com/history?&id=633+U0400&cl=
## 4273   http://ntusweety.herokuapp.com/history?&id=633+U0720&cl=
## 4274   http://ntusweety.herokuapp.com/history?&id=633+U0760&cl=
## 4275   http://ntusweety.herokuapp.com/history?&id=633+U0770&cl=
## 4276   http://ntusweety.herokuapp.com/history?&id=633+U0800&cl=
## 4277 http://ntusweety.herokuapp.com/history?&id=633+U0832&cl=02
## 4278   http://ntusweety.herokuapp.com/history?&id=633+U1032&cl=
## 4279   http://ntusweety.herokuapp.com/history?&id=633+U1042&cl=
## 4280   http://ntusweety.herokuapp.com/history?&id=633+U1220&cl=
## 4281   http://ntusweety.herokuapp.com/history?&id=633+U1330&cl=
## 4282   http://ntusweety.herokuapp.com/history?&id=633+U1340&cl=
## 4283   http://ntusweety.herokuapp.com/history?&id=641+10100&cl=
## 4284   http://ntusweety.herokuapp.com/history?&id=641+D0010&cl=
## 4285 http://ntusweety.herokuapp.com/history?&id=641+D0030&cl=01
## 4286 http://ntusweety.herokuapp.com/history?&id=641+D0030&cl=02
## 4287   http://ntusweety.herokuapp.com/history?&id=641+D1140&cl=
## 4288   http://ntusweety.herokuapp.com/history?&id=641+D1150&cl=
## 4289   http://ntusweety.herokuapp.com/history?&id=641+M0010&cl=
## 4290 http://ntusweety.herokuapp.com/history?&id=641+M0030&cl=01
## 4291 http://ntusweety.herokuapp.com/history?&id=641+M0030&cl=02
## 4292   http://ntusweety.herokuapp.com/history?&id=641+M1460&cl=
## 4293   http://ntusweety.herokuapp.com/history?&id=641EM1470&cl=
## 4294   http://ntusweety.herokuapp.com/history?&id=641+M2140&cl=
## 4295   http://ntusweety.herokuapp.com/history?&id=641+M2160&cl=
## 4296   http://ntusweety.herokuapp.com/history?&id=641+M3060&cl=
## 4297   http://ntusweety.herokuapp.com/history?&id=641EM3090&cl=
## 4298   http://ntusweety.herokuapp.com/history?&id=641+M3110&cl=
## 4299   http://ntusweety.herokuapp.com/history?&id=641+M3120&cl=
## 4300   http://ntusweety.herokuapp.com/history?&id=641+U0130&cl=
## 4301   http://ntusweety.herokuapp.com/history?&id=641+U0550&cl=
## 4302   http://ntusweety.herokuapp.com/history?&id=641+U0580&cl=
## 4303   http://ntusweety.herokuapp.com/history?&id=641+U3060&cl=
## 4304   http://ntusweety.herokuapp.com/history?&id=641+U3090&cl=
## 4305   http://ntusweety.herokuapp.com/history?&id=641+U3100&cl=
## 4306   http://ntusweety.herokuapp.com/history?&id=642+D0010&cl=
## 4307   http://ntusweety.herokuapp.com/history?&id=642ED0070&cl=
## 4308   http://ntusweety.herokuapp.com/history?&id=642ED0080&cl=
## 4309 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=01
## 4310 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=02
## 4311 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=03
## 4312 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=04
## 4313 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=05
## 4314 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=06
## 4315 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=07
## 4316 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=08
## 4317 http://ntusweety.herokuapp.com/history?&id=642ED0090&cl=09
## 4318 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=01
## 4319 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=02
## 4320 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=03
## 4321 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=04
## 4322 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=05
## 4323 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=06
## 4324 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=07
## 4325 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=08
## 4326 http://ntusweety.herokuapp.com/history?&id=642ED0100&cl=09
## 4327   http://ntusweety.herokuapp.com/history?&id=642ED0190&cl=
## 4328 http://ntusweety.herokuapp.com/history?&id=642ED0220&cl=01
## 4329 http://ntusweety.herokuapp.com/history?&id=642ED0220&cl=02
## 4330 http://ntusweety.herokuapp.com/history?&id=642ED0220&cl=03
## 4331   http://ntusweety.herokuapp.com/history?&id=642+M0010&cl=
## 4332   http://ntusweety.herokuapp.com/history?&id=642EM0030&cl=
## 4333   http://ntusweety.herokuapp.com/history?&id=642EM0080&cl=
## 4334   http://ntusweety.herokuapp.com/history?&id=642EM0120&cl=
## 4335   http://ntusweety.herokuapp.com/history?&id=642EM0130&cl=
## 4336   http://ntusweety.herokuapp.com/history?&id=642+M0140&cl=
## 4337   http://ntusweety.herokuapp.com/history?&id=642EM0150&cl=
## 4338 http://ntusweety.herokuapp.com/history?&id=642EM0170&cl=01
## 4339 http://ntusweety.herokuapp.com/history?&id=642EM0170&cl=02
## 4340   http://ntusweety.herokuapp.com/history?&id=642EU0080&cl=
## 4341   http://ntusweety.herokuapp.com/history?&id=643+M0010&cl=
## 4342 http://ntusweety.herokuapp.com/history?&id=643+M0080&cl=03
## 4343 http://ntusweety.herokuapp.com/history?&id=643+M0080&cl=04
## 4344 http://ntusweety.herokuapp.com/history?&id=643+M0080&cl=06
## 4345 http://ntusweety.herokuapp.com/history?&id=643+M0080&cl=07
## 4346 http://ntusweety.herokuapp.com/history?&id=643+M0080&cl=09
## 4347 http://ntusweety.herokuapp.com/history?&id=643+M0100&cl=02
## 4348 http://ntusweety.herokuapp.com/history?&id=643+M0100&cl=04
## 4349 http://ntusweety.herokuapp.com/history?&id=643+M0100&cl=06
## 4350 http://ntusweety.herokuapp.com/history?&id=643+M0100&cl=07
## 4351 http://ntusweety.herokuapp.com/history?&id=643+M0100&cl=08
## 4352   http://ntusweety.herokuapp.com/history?&id=643+M0210&cl=
## 4353   http://ntusweety.herokuapp.com/history?&id=643+M0230&cl=
## 4354   http://ntusweety.herokuapp.com/history?&id=643+M2250&cl=
## 4355   http://ntusweety.herokuapp.com/history?&id=643+M2270&cl=
## 4356   http://ntusweety.herokuapp.com/history?&id=643+M2290&cl=
## 4357   http://ntusweety.herokuapp.com/history?&id=643+M2310&cl=
## 4358   http://ntusweety.herokuapp.com/history?&id=643+M2350&cl=
## 4359   http://ntusweety.herokuapp.com/history?&id=643+M2370&cl=
## 4360   http://ntusweety.herokuapp.com/history?&id=643+M2390&cl=
## 4361   http://ntusweety.herokuapp.com/history?&id=644+M0010&cl=
## 4362   http://ntusweety.herokuapp.com/history?&id=644+M0040&cl=
## 4363   http://ntusweety.herokuapp.com/history?&id=644+M0060&cl=
## 4364 http://ntusweety.herokuapp.com/history?&id=644+M0080&cl=03
## 4365 http://ntusweety.herokuapp.com/history?&id=644+M0080&cl=04
## 4366 http://ntusweety.herokuapp.com/history?&id=644+M0080&cl=05
## 4367 http://ntusweety.herokuapp.com/history?&id=644+M0080&cl=06
## 4368 http://ntusweety.herokuapp.com/history?&id=644+M0100&cl=03
## 4369 http://ntusweety.herokuapp.com/history?&id=644+M0100&cl=04
## 4370 http://ntusweety.herokuapp.com/history?&id=644+M0100&cl=05
## 4371 http://ntusweety.herokuapp.com/history?&id=644+M0100&cl=06
## 4372   http://ntusweety.herokuapp.com/history?&id=644EM0140&cl=
## 4373   http://ntusweety.herokuapp.com/history?&id=644EM0160&cl=
## 4374   http://ntusweety.herokuapp.com/history?&id=644EM0180&cl=
## 4375   http://ntusweety.herokuapp.com/history?&id=644+M0200&cl=
## 4376   http://ntusweety.herokuapp.com/history?&id=644+U0090&cl=
## 4377   http://ntusweety.herokuapp.com/history?&id=645+M0010&cl=
## 4378   http://ntusweety.herokuapp.com/history?&id=645+M0030&cl=
## 4379   http://ntusweety.herokuapp.com/history?&id=645+M0050&cl=
## 4380   http://ntusweety.herokuapp.com/history?&id=645+U1030&cl=
## 4381   http://ntusweety.herokuapp.com/history?&id=645+U1040&cl=
## 4382 http://ntusweety.herokuapp.com/history?&id=645+U1060&cl=01
## 4383 http://ntusweety.herokuapp.com/history?&id=645+U1080&cl=01
## 4384 http://ntusweety.herokuapp.com/history?&id=645+U1080&cl=02
## 4385   http://ntusweety.herokuapp.com/history?&id=645+U1152&cl=
## 4386   http://ntusweety.herokuapp.com/history?&id=645+U1162&cl=
## 4387   http://ntusweety.herokuapp.com/history?&id=645+U1170&cl=
## 4388   http://ntusweety.herokuapp.com/history?&id=645+U1180&cl=
## 4389   http://ntusweety.herokuapp.com/history?&id=701+19000&cl=
## 4390 http://ntusweety.herokuapp.com/history?&id=701+20112&cl=01
## 4391 http://ntusweety.herokuapp.com/history?&id=701+20112&cl=03
## 4392   http://ntusweety.herokuapp.com/history?&id=701+20900&cl=
## 4393   http://ntusweety.herokuapp.com/history?&id=701+21000&cl=
## 4394 http://ntusweety.herokuapp.com/history?&id=701+21000&cl=03
## 4395 http://ntusweety.herokuapp.com/history?&id=701+21500&cl=01
## 4396 http://ntusweety.herokuapp.com/history?&id=701E21500&cl=02
## 4397   http://ntusweety.herokuapp.com/history?&id=701+28100&cl=
## 4398   http://ntusweety.herokuapp.com/history?&id=701+31600&cl=
## 4399   http://ntusweety.herokuapp.com/history?&id=701+31900&cl=
## 4400   http://ntusweety.herokuapp.com/history?&id=701+33500&cl=
## 4401   http://ntusweety.herokuapp.com/history?&id=701+40600&cl=
## 4402 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=01
## 4403 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=02
## 4404 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=03
## 4405 http://ntusweety.herokuapp.com/history?&id=702+10112&cl=04
## 4406 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=05
## 4407 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=06
## 4408 http://ntusweety.herokuapp.com/history?&id=702E10112&cl=07
## 4409   http://ntusweety.herokuapp.com/history?&id=702+10212&cl=
## 4410 http://ntusweety.herokuapp.com/history?&id=702+10402&cl=01
## 4411 http://ntusweety.herokuapp.com/history?&id=702+10402&cl=02
## 4412   http://ntusweety.herokuapp.com/history?&id=702+12020&cl=
## 4413 http://ntusweety.herokuapp.com/history?&id=702+20112&cl=01
## 4414 http://ntusweety.herokuapp.com/history?&id=702+20112&cl=02
## 4415 http://ntusweety.herokuapp.com/history?&id=702+20640&cl=01
## 4416 http://ntusweety.herokuapp.com/history?&id=702E20662&cl=01
## 4417 http://ntusweety.herokuapp.com/history?&id=702E20662&cl=02
## 4418 http://ntusweety.herokuapp.com/history?&id=702+20662&cl=03
## 4419 http://ntusweety.herokuapp.com/history?&id=702E20662&cl=04
## 4420   http://ntusweety.herokuapp.com/history?&id=702+28100&cl=
## 4421 http://ntusweety.herokuapp.com/history?&id=702+30102&cl=01
## 4422 http://ntusweety.herokuapp.com/history?&id=702+30102&cl=02
## 4423 http://ntusweety.herokuapp.com/history?&id=702+30402&cl=01
## 4424 http://ntusweety.herokuapp.com/history?&id=702E30402&cl=02
## 4425 http://ntusweety.herokuapp.com/history?&id=702E30402&cl=03
## 4426 http://ntusweety.herokuapp.com/history?&id=702+31100&cl=01
## 4427 http://ntusweety.herokuapp.com/history?&id=702+40102&cl=01
## 4428 http://ntusweety.herokuapp.com/history?&id=702+40102&cl=02
## 4429 http://ntusweety.herokuapp.com/history?&id=702+40102&cl=03
## 4430   http://ntusweety.herokuapp.com/history?&id=702+43120&cl=
## 4431 http://ntusweety.herokuapp.com/history?&id=703+20112&cl=01
## 4432 http://ntusweety.herokuapp.com/history?&id=703+20112&cl=02
## 4433 http://ntusweety.herokuapp.com/history?&id=703+21712&cl=01
## 4434 http://ntusweety.herokuapp.com/history?&id=703+21712&cl=02
## 4435 http://ntusweety.herokuapp.com/history?&id=703+22600&cl=01
## 4436 http://ntusweety.herokuapp.com/history?&id=703+22600&cl=02
## 4437 http://ntusweety.herokuapp.com/history?&id=703+22600&cl=03
## 4438 http://ntusweety.herokuapp.com/history?&id=703+22600&cl=04
## 4439 http://ntusweety.herokuapp.com/history?&id=703+22600&cl=05
## 4440   http://ntusweety.herokuapp.com/history?&id=703+28100&cl=
## 4441 http://ntusweety.herokuapp.com/history?&id=703+30600&cl=01
## 4442 http://ntusweety.herokuapp.com/history?&id=703+30600&cl=02
## 4443 http://ntusweety.herokuapp.com/history?&id=703+30600&cl=03
## 4444 http://ntusweety.herokuapp.com/history?&id=703+30600&cl=04
## 4445 http://ntusweety.herokuapp.com/history?&id=703+30600&cl=05
## 4446 http://ntusweety.herokuapp.com/history?&id=703E30600&cl=06
## 4447   http://ntusweety.herokuapp.com/history?&id=703+30700&cl=
## 4448 http://ntusweety.herokuapp.com/history?&id=703+30900&cl=01
## 4449 http://ntusweety.herokuapp.com/history?&id=703+30900&cl=02
## 4450   http://ntusweety.herokuapp.com/history?&id=703+31600&cl=
## 4451   http://ntusweety.herokuapp.com/history?&id=703+33602&cl=
## 4452 http://ntusweety.herokuapp.com/history?&id=703+42110&cl=01
## 4453 http://ntusweety.herokuapp.com/history?&id=703+42110&cl=02
## 4454   http://ntusweety.herokuapp.com/history?&id=703+42500&cl=
## 4455   http://ntusweety.herokuapp.com/history?&id=703+46000&cl=
## 4456 http://ntusweety.herokuapp.com/history?&id=704+10112&cl=01
## 4457 http://ntusweety.herokuapp.com/history?&id=704+10112&cl=02
## 4458 http://ntusweety.herokuapp.com/history?&id=704+20112&cl=01
## 4459 http://ntusweety.herokuapp.com/history?&id=704+20112&cl=02
## 4460 http://ntusweety.herokuapp.com/history?&id=704+20600&cl=01
## 4461 http://ntusweety.herokuapp.com/history?&id=704+20600&cl=02
## 4462 http://ntusweety.herokuapp.com/history?&id=704+28100&cl=01
## 4463 http://ntusweety.herokuapp.com/history?&id=704+28100&cl=02
## 4464 http://ntusweety.herokuapp.com/history?&id=704+32600&cl=01
## 4465 http://ntusweety.herokuapp.com/history?&id=704+32600&cl=02
## 4466 http://ntusweety.herokuapp.com/history?&id=704+41100&cl=01
## 4467 http://ntusweety.herokuapp.com/history?&id=704+41100&cl=02
## 4468   http://ntusweety.herokuapp.com/history?&id=705+10300&cl=
## 4469   http://ntusweety.herokuapp.com/history?&id=705+12100&cl=
## 4470   http://ntusweety.herokuapp.com/history?&id=705+20300&cl=
## 4471   http://ntusweety.herokuapp.com/history?&id=705+21112&cl=
## 4472   http://ntusweety.herokuapp.com/history?&id=705+22100&cl=
## 4473   http://ntusweety.herokuapp.com/history?&id=705+22200&cl=
## 4474   http://ntusweety.herokuapp.com/history?&id=705+23300&cl=
## 4475   http://ntusweety.herokuapp.com/history?&id=705+30400&cl=
## 4476   http://ntusweety.herokuapp.com/history?&id=705+31200&cl=
## 4477 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=01
## 4478 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=02
## 4479 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=04
## 4480 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=05
## 4481 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=06
## 4482 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=08
## 4483 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=11
## 4484 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=14
## 4485 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=15
## 4486 http://ntusweety.herokuapp.com/history?&id=705+31600&cl=16
## 4487 http://ntusweety.herokuapp.com/history?&id=705+31700&cl=02
## 4488   http://ntusweety.herokuapp.com/history?&id=705E32100&cl=
## 4489   http://ntusweety.herokuapp.com/history?&id=705E33100&cl=
## 4490   http://ntusweety.herokuapp.com/history?&id=722+D0010&cl=
## 4491   http://ntusweety.herokuapp.com/history?&id=722+D5120&cl=
## 4492   http://ntusweety.herokuapp.com/history?&id=722ED6020&cl=
## 4493   http://ntusweety.herokuapp.com/history?&id=722ED6040&cl=
## 4494   http://ntusweety.herokuapp.com/history?&id=722+M0010&cl=
## 4495   http://ntusweety.herokuapp.com/history?&id=722+M1320&cl=
## 4496   http://ntusweety.herokuapp.com/history?&id=722+M3300&cl=
## 4497   http://ntusweety.herokuapp.com/history?&id=722+M5090&cl=
## 4498   http://ntusweety.herokuapp.com/history?&id=722+U0920&cl=
## 4499   http://ntusweety.herokuapp.com/history?&id=722+U1100&cl=
## 4500   http://ntusweety.herokuapp.com/history?&id=722+U4000&cl=
## 4501   http://ntusweety.herokuapp.com/history?&id=722+U4420&cl=
## 4502   http://ntusweety.herokuapp.com/history?&id=722+U5070&cl=
## 4503   http://ntusweety.herokuapp.com/history?&id=722+U9000&cl=
## 4504   http://ntusweety.herokuapp.com/history?&id=723+D0010&cl=
## 4505   http://ntusweety.herokuapp.com/history?&id=723ED0030&cl=
## 4506   http://ntusweety.herokuapp.com/history?&id=723+D0500&cl=
## 4507   http://ntusweety.herokuapp.com/history?&id=723+D1050&cl=
## 4508   http://ntusweety.herokuapp.com/history?&id=723ED5110&cl=
## 4509   http://ntusweety.herokuapp.com/history?&id=723+D6100&cl=
## 4510   http://ntusweety.herokuapp.com/history?&id=723+M0010&cl=
## 4511 http://ntusweety.herokuapp.com/history?&id=723+M0040&cl=01
## 4512 http://ntusweety.herokuapp.com/history?&id=723+M0040&cl=02
## 4513 http://ntusweety.herokuapp.com/history?&id=723EM0040&cl=03
## 4514   http://ntusweety.herokuapp.com/history?&id=723+M2000&cl=
## 4515   http://ntusweety.herokuapp.com/history?&id=723+M4220&cl=
## 4516   http://ntusweety.herokuapp.com/history?&id=723+M7130&cl=
## 4517   http://ntusweety.herokuapp.com/history?&id=723+M8500&cl=
## 4518   http://ntusweety.herokuapp.com/history?&id=723+M9000&cl=
## 4519   http://ntusweety.herokuapp.com/history?&id=723+M9200&cl=
## 4520   http://ntusweety.herokuapp.com/history?&id=723+M9500&cl=
## 4521   http://ntusweety.herokuapp.com/history?&id=723+M9510&cl=
## 4522   http://ntusweety.herokuapp.com/history?&id=723+M9700&cl=
## 4523   http://ntusweety.herokuapp.com/history?&id=723+U1400&cl=
## 4524   http://ntusweety.herokuapp.com/history?&id=723+U2200&cl=
## 4525   http://ntusweety.herokuapp.com/history?&id=723+U2900&cl=
## 4526   http://ntusweety.herokuapp.com/history?&id=723+U9540&cl=
## 4527   http://ntusweety.herokuapp.com/history?&id=723+U9560&cl=
## 4528   http://ntusweety.herokuapp.com/history?&id=724+D0010&cl=
## 4529   http://ntusweety.herokuapp.com/history?&id=724+D2140&cl=
## 4530   http://ntusweety.herokuapp.com/history?&id=724+D2510&cl=
## 4531   http://ntusweety.herokuapp.com/history?&id=724+D3230&cl=
## 4532   http://ntusweety.herokuapp.com/history?&id=724+D4050&cl=
## 4533   http://ntusweety.herokuapp.com/history?&id=724+D6300&cl=
## 4534   http://ntusweety.herokuapp.com/history?&id=724+D7200&cl=
## 4535   http://ntusweety.herokuapp.com/history?&id=724+D8040&cl=
## 4536   http://ntusweety.herokuapp.com/history?&id=724+D9220&cl=
## 4537   http://ntusweety.herokuapp.com/history?&id=724+M0010&cl=
## 4538   http://ntusweety.herokuapp.com/history?&id=724+M0200&cl=
## 4539   http://ntusweety.herokuapp.com/history?&id=724+M0460&cl=
## 4540   http://ntusweety.herokuapp.com/history?&id=724+M1270&cl=
## 4541   http://ntusweety.herokuapp.com/history?&id=724+M1350&cl=
## 4542   http://ntusweety.herokuapp.com/history?&id=724+M1990&cl=
## 4543   http://ntusweety.herokuapp.com/history?&id=724+U0180&cl=
## 4544   http://ntusweety.herokuapp.com/history?&id=724+U0210&cl=
## 4545   http://ntusweety.herokuapp.com/history?&id=724+U0580&cl=
## 4546   http://ntusweety.herokuapp.com/history?&id=724EU1300&cl=
## 4547   http://ntusweety.herokuapp.com/history?&id=724EU1670&cl=
## 4548   http://ntusweety.herokuapp.com/history?&id=724EU2300&cl=
## 4549   http://ntusweety.herokuapp.com/history?&id=724+U2460&cl=
## 4550   http://ntusweety.herokuapp.com/history?&id=724+U8300&cl=
## 4551   http://ntusweety.herokuapp.com/history?&id=724+U9600&cl=
## 4552   http://ntusweety.herokuapp.com/history?&id=725+D0010&cl=
## 4553   http://ntusweety.herokuapp.com/history?&id=725+D1140&cl=
## 4554   http://ntusweety.herokuapp.com/history?&id=725+D3160&cl=
## 4555   http://ntusweety.herokuapp.com/history?&id=725+D3300&cl=
## 4556   http://ntusweety.herokuapp.com/history?&id=725+M0010&cl=
## 4557   http://ntusweety.herokuapp.com/history?&id=725+M2300&cl=
## 4558   http://ntusweety.herokuapp.com/history?&id=725+M3030&cl=
## 4559   http://ntusweety.herokuapp.com/history?&id=725+M3050&cl=
## 4560   http://ntusweety.herokuapp.com/history?&id=725+M3130&cl=
## 4561   http://ntusweety.herokuapp.com/history?&id=725+M3190&cl=
## 4562   http://ntusweety.herokuapp.com/history?&id=725+M3210&cl=
## 4563   http://ntusweety.herokuapp.com/history?&id=725+M3330&cl=
## 4564   http://ntusweety.herokuapp.com/history?&id=725EM3630&cl=
## 4565   http://ntusweety.herokuapp.com/history?&id=725+M3680&cl=
## 4566   http://ntusweety.herokuapp.com/history?&id=725EM4160&cl=
## 4567   http://ntusweety.herokuapp.com/history?&id=725+M4170&cl=
## 4568   http://ntusweety.herokuapp.com/history?&id=725+M4180&cl=
## 4569   http://ntusweety.herokuapp.com/history?&id=725+U1120&cl=
## 4570   http://ntusweety.herokuapp.com/history?&id=725+U2340&cl=
## 4571   http://ntusweety.herokuapp.com/history?&id=725+U3360&cl=
## 4572   http://ntusweety.herokuapp.com/history?&id=725+U3470&cl=
## 4573   http://ntusweety.herokuapp.com/history?&id=741+D0010&cl=
## 4574   http://ntusweety.herokuapp.com/history?&id=741+D0150&cl=
## 4575   http://ntusweety.herokuapp.com/history?&id=741+D3040&cl=
## 4576   http://ntusweety.herokuapp.com/history?&id=741+D7010&cl=
## 4577   http://ntusweety.herokuapp.com/history?&id=741+M0010&cl=
## 4578   http://ntusweety.herokuapp.com/history?&id=741+M0620&cl=
## 4579   http://ntusweety.herokuapp.com/history?&id=741+M2200&cl=
## 4580 http://ntusweety.herokuapp.com/history?&id=741+M2200&cl=02
## 4581   http://ntusweety.herokuapp.com/history?&id=741+M3330&cl=
## 4582   http://ntusweety.herokuapp.com/history?&id=741+M4810&cl=
## 4583   http://ntusweety.herokuapp.com/history?&id=741+M5030&cl=
## 4584   http://ntusweety.herokuapp.com/history?&id=741+M5060&cl=
## 4585   http://ntusweety.herokuapp.com/history?&id=741+M7210&cl=
## 4586   http://ntusweety.herokuapp.com/history?&id=741+M8000&cl=
## 4587   http://ntusweety.herokuapp.com/history?&id=741+U0130&cl=
## 4588   http://ntusweety.herokuapp.com/history?&id=741+U0250&cl=
## 4589   http://ntusweety.herokuapp.com/history?&id=741+U3090&cl=
## 4590   http://ntusweety.herokuapp.com/history?&id=741+U3340&cl=
## 4591   http://ntusweety.herokuapp.com/history?&id=741+U3520&cl=
## 4592   http://ntusweety.herokuapp.com/history?&id=741+U4960&cl=
## 4593   http://ntusweety.herokuapp.com/history?&id=741+U7100&cl=
## 4594   http://ntusweety.herokuapp.com/history?&id=741+U7700&cl=
## 4595   http://ntusweety.herokuapp.com/history?&id=741+U7800&cl=
## 4596   http://ntusweety.herokuapp.com/history?&id=741+U9060&cl=
## 4597   http://ntusweety.herokuapp.com/history?&id=741+U9440&cl=
## 4598   http://ntusweety.herokuapp.com/history?&id=741+U9600&cl=
## 4599   http://ntusweety.herokuapp.com/history?&id=741+U9720&cl=
## 4600   http://ntusweety.herokuapp.com/history?&id=741+U9860&cl=
## 4601   http://ntusweety.herokuapp.com/history?&id=749EM0010&cl=
## 4602   http://ntusweety.herokuapp.com/history?&id=749EM0130&cl=
## 4603   http://ntusweety.herokuapp.com/history?&id=749EM0140&cl=
## 4604   http://ntusweety.herokuapp.com/history?&id=749EM0150&cl=
## 4605   http://ntusweety.herokuapp.com/history?&id=749EM0170&cl=
## 4606   http://ntusweety.herokuapp.com/history?&id=749EM0580&cl=
## 4607   http://ntusweety.herokuapp.com/history?&id=749EM0620&cl=
## 4608   http://ntusweety.herokuapp.com/history?&id=749EM0840&cl=
## 4609   http://ntusweety.herokuapp.com/history?&id=749EM0860&cl=
## 4610   http://ntusweety.herokuapp.com/history?&id=749EM0930&cl=
## 4611   http://ntusweety.herokuapp.com/history?&id=749EM1220&cl=
## 4612   http://ntusweety.herokuapp.com/history?&id=801+21310&cl=
## 4613   http://ntusweety.herokuapp.com/history?&id=801+21410&cl=
## 4614   http://ntusweety.herokuapp.com/history?&id=801+23100&cl=
## 4615   http://ntusweety.herokuapp.com/history?&id=801+31100&cl=
## 4616   http://ntusweety.herokuapp.com/history?&id=801+32100&cl=
## 4617   http://ntusweety.herokuapp.com/history?&id=801+32410&cl=
## 4618   http://ntusweety.herokuapp.com/history?&id=801+32500&cl=
## 4619   http://ntusweety.herokuapp.com/history?&id=801+33300&cl=
## 4620   http://ntusweety.herokuapp.com/history?&id=801+33900&cl=
## 4621   http://ntusweety.herokuapp.com/history?&id=801+34000&cl=
## 4622   http://ntusweety.herokuapp.com/history?&id=801+35300&cl=
## 4623   http://ntusweety.herokuapp.com/history?&id=801+36300&cl=
## 4624   http://ntusweety.herokuapp.com/history?&id=801+36420&cl=
## 4625   http://ntusweety.herokuapp.com/history?&id=801+40300&cl=
## 4626 http://ntusweety.herokuapp.com/history?&id=801+40700&cl=01
## 4627 http://ntusweety.herokuapp.com/history?&id=801+40700&cl=02
## 4628 http://ntusweety.herokuapp.com/history?&id=801+40700&cl=04
## 4629 http://ntusweety.herokuapp.com/history?&id=801+40700&cl=05
## 4630 http://ntusweety.herokuapp.com/history?&id=801+40700&cl=06
## 4631   http://ntusweety.herokuapp.com/history?&id=801+40810&cl=
## 4632   http://ntusweety.herokuapp.com/history?&id=801+48500&cl=
## 4633   http://ntusweety.herokuapp.com/history?&id=841+D0010&cl=
## 4634   http://ntusweety.herokuapp.com/history?&id=841+D0500&cl=
## 4635   http://ntusweety.herokuapp.com/history?&id=841ED0710&cl=
## 4636   http://ntusweety.herokuapp.com/history?&id=841ED0720&cl=
## 4637   http://ntusweety.herokuapp.com/history?&id=841+M0010&cl=
## 4638   http://ntusweety.herokuapp.com/history?&id=841+M1092&cl=
## 4639   http://ntusweety.herokuapp.com/history?&id=841+M1122&cl=
## 4640   http://ntusweety.herokuapp.com/history?&id=841+M1150&cl=
## 4641   http://ntusweety.herokuapp.com/history?&id=841+M1580&cl=
## 4642   http://ntusweety.herokuapp.com/history?&id=841+M1670&cl=
## 4643   http://ntusweety.herokuapp.com/history?&id=841+M1690&cl=
## 4644   http://ntusweety.herokuapp.com/history?&id=841+M1700&cl=
## 4645   http://ntusweety.herokuapp.com/history?&id=841+M1710&cl=
## 4646   http://ntusweety.herokuapp.com/history?&id=841+M1880&cl=
## 4647   http://ntusweety.herokuapp.com/history?&id=841+M1940&cl=
## 4648   http://ntusweety.herokuapp.com/history?&id=841+U0090&cl=
## 4649   http://ntusweety.herokuapp.com/history?&id=841+U1320&cl=
## 4650   http://ntusweety.herokuapp.com/history?&id=841+U5180&cl=
## 4651   http://ntusweety.herokuapp.com/history?&id=841+U5200&cl=
## 4652   http://ntusweety.herokuapp.com/history?&id=841+U5270&cl=
## 4653   http://ntusweety.herokuapp.com/history?&id=841+U5480&cl=
## 4654   http://ntusweety.herokuapp.com/history?&id=841EU5520&cl=
## 4655   http://ntusweety.herokuapp.com/history?&id=841+U5540&cl=
## 4656   http://ntusweety.herokuapp.com/history?&id=841+U5590&cl=
## 4657   http://ntusweety.herokuapp.com/history?&id=841+U5680&cl=
## 4658   http://ntusweety.herokuapp.com/history?&id=841+U5710&cl=
## 4659   http://ntusweety.herokuapp.com/history?&id=841+U5760&cl=
## 4660   http://ntusweety.herokuapp.com/history?&id=841EU5770&cl=
## 4661   http://ntusweety.herokuapp.com/history?&id=841EU5780&cl=
## 4662   http://ntusweety.herokuapp.com/history?&id=844+D0010&cl=
## 4663   http://ntusweety.herokuapp.com/history?&id=844ED1010&cl=
## 4664   http://ntusweety.herokuapp.com/history?&id=844ED1080&cl=
## 4665   http://ntusweety.herokuapp.com/history?&id=844+M0010&cl=
## 4666   http://ntusweety.herokuapp.com/history?&id=844+M1200&cl=
## 4667   http://ntusweety.herokuapp.com/history?&id=844+M1270&cl=
## 4668   http://ntusweety.herokuapp.com/history?&id=844+M1290&cl=
## 4669   http://ntusweety.herokuapp.com/history?&id=844+M1320&cl=
## 4670   http://ntusweety.herokuapp.com/history?&id=844+M1350&cl=
## 4671   http://ntusweety.herokuapp.com/history?&id=844+U1150&cl=
## 4672   http://ntusweety.herokuapp.com/history?&id=844+U1160&cl=
## 4673   http://ntusweety.herokuapp.com/history?&id=844+U1240&cl=
## 4674   http://ntusweety.herokuapp.com/history?&id=844+U1250&cl=
## 4675   http://ntusweety.herokuapp.com/history?&id=844EU1260&cl=
## 4676   http://ntusweety.herokuapp.com/history?&id=844+U1340&cl=
## 4677   http://ntusweety.herokuapp.com/history?&id=847+M0010&cl=
## 4678   http://ntusweety.herokuapp.com/history?&id=847+M0020&cl=
## 4679   http://ntusweety.herokuapp.com/history?&id=847+M0090&cl=
## 4680   http://ntusweety.herokuapp.com/history?&id=847+U0030&cl=
## 4681   http://ntusweety.herokuapp.com/history?&id=847+U0120&cl=
## 4682   http://ntusweety.herokuapp.com/history?&id=848+D0010&cl=
## 4683   http://ntusweety.herokuapp.com/history?&id=848+D0040&cl=
## 4684 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=01
## 4685 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=02
## 4686 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=03
## 4687 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=04
## 4688 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=05
## 4689 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=06
## 4690 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=07
## 4691 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=08
## 4692 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=09
## 4693 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=10
## 4694 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=11
## 4695 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=12
## 4696 http://ntusweety.herokuapp.com/history?&id=848+D0060&cl=13
## 4697   http://ntusweety.herokuapp.com/history?&id=848+M0010&cl=
## 4698   http://ntusweety.herokuapp.com/history?&id=848+M0050&cl=
## 4699   http://ntusweety.herokuapp.com/history?&id=848+M1080&cl=
## 4700   http://ntusweety.herokuapp.com/history?&id=848+M1180&cl=
## 4701   http://ntusweety.herokuapp.com/history?&id=848+M2080&cl=
## 4702   http://ntusweety.herokuapp.com/history?&id=848+M2120&cl=
## 4703   http://ntusweety.herokuapp.com/history?&id=848+M2150&cl=
## 4704   http://ntusweety.herokuapp.com/history?&id=848+M2180&cl=
## 4705   http://ntusweety.herokuapp.com/history?&id=848+M2240&cl=
## 4706   http://ntusweety.herokuapp.com/history?&id=848+M2290&cl=
## 4707   http://ntusweety.herokuapp.com/history?&id=848+M2310&cl=
## 4708   http://ntusweety.herokuapp.com/history?&id=848+M2340&cl=
## 4709   http://ntusweety.herokuapp.com/history?&id=848EM2380&cl=
## 4710   http://ntusweety.herokuapp.com/history?&id=848+M2410&cl=
## 4711   http://ntusweety.herokuapp.com/history?&id=848+U0010&cl=
## 4712   http://ntusweety.herokuapp.com/history?&id=848+U1100&cl=
## 4713   http://ntusweety.herokuapp.com/history?&id=849+D0010&cl=
## 4714   http://ntusweety.herokuapp.com/history?&id=849+D0040&cl=
## 4715   http://ntusweety.herokuapp.com/history?&id=849+D0050&cl=
## 4716   http://ntusweety.herokuapp.com/history?&id=849+D0060&cl=
## 4717   http://ntusweety.herokuapp.com/history?&id=849+D0210&cl=
## 4718   http://ntusweety.herokuapp.com/history?&id=849+D0240&cl=
## 4719   http://ntusweety.herokuapp.com/history?&id=849+D0260&cl=
## 4720   http://ntusweety.herokuapp.com/history?&id=849+D0370&cl=
## 4721   http://ntusweety.herokuapp.com/history?&id=849ED0400&cl=
## 4722   http://ntusweety.herokuapp.com/history?&id=849+M0010&cl=
## 4723   http://ntusweety.herokuapp.com/history?&id=849+M0030&cl=
## 4724   http://ntusweety.herokuapp.com/history?&id=849+M0050&cl=
## 4725   http://ntusweety.herokuapp.com/history?&id=849+M0200&cl=
## 4726   http://ntusweety.herokuapp.com/history?&id=849+M0220&cl=
## 4727   http://ntusweety.herokuapp.com/history?&id=849+M0250&cl=
## 4728   http://ntusweety.herokuapp.com/history?&id=849+M0270&cl=
## 4729   http://ntusweety.herokuapp.com/history?&id=849+M0280&cl=
## 4730   http://ntusweety.herokuapp.com/history?&id=849+M0290&cl=
## 4731   http://ntusweety.herokuapp.com/history?&id=849+M0300&cl=
## 4732   http://ntusweety.herokuapp.com/history?&id=849+M0370&cl=
## 4733   http://ntusweety.herokuapp.com/history?&id=849+M0430&cl=
## 4734   http://ntusweety.herokuapp.com/history?&id=849+M0560&cl=
## 4735   http://ntusweety.herokuapp.com/history?&id=849+M0570&cl=
## 4736 http://ntusweety.herokuapp.com/history?&id=849+M0570&cl=01
## 4737 http://ntusweety.herokuapp.com/history?&id=849+M0570&cl=02
## 4738 http://ntusweety.herokuapp.com/history?&id=849+M0570&cl=04
## 4739   http://ntusweety.herokuapp.com/history?&id=849+M0610&cl=
## 4740   http://ntusweety.herokuapp.com/history?&id=849+M0630&cl=
## 4741   http://ntusweety.herokuapp.com/history?&id=849+M0640&cl=
## 4742   http://ntusweety.herokuapp.com/history?&id=849+M0790&cl=
## 4743   http://ntusweety.herokuapp.com/history?&id=849+M0840&cl=
## 4744   http://ntusweety.herokuapp.com/history?&id=849EM0850&cl=
## 4745   http://ntusweety.herokuapp.com/history?&id=849+M0860&cl=
## 4746   http://ntusweety.herokuapp.com/history?&id=849+U0060&cl=
## 4747   http://ntusweety.herokuapp.com/history?&id=849+U0110&cl=
## 4748   http://ntusweety.herokuapp.com/history?&id=849+U0140&cl=
## 4749   http://ntusweety.herokuapp.com/history?&id=849+U0150&cl=
## 4750   http://ntusweety.herokuapp.com/history?&id=849+U0270&cl=
## 4751   http://ntusweety.herokuapp.com/history?&id=849+U0290&cl=
## 4752   http://ntusweety.herokuapp.com/history?&id=849+U0320&cl=
## 4753 http://ntusweety.herokuapp.com/history?&id=901+10030&cl=01
## 4754 http://ntusweety.herokuapp.com/history?&id=901+10030&cl=02
## 4755 http://ntusweety.herokuapp.com/history?&id=901+10030&cl=03
## 4756 http://ntusweety.herokuapp.com/history?&id=901+10040&cl=01
## 4757 http://ntusweety.herokuapp.com/history?&id=901+10040&cl=02
## 4758   http://ntusweety.herokuapp.com/history?&id=901+10080&cl=
## 4759 http://ntusweety.herokuapp.com/history?&id=901+10110&cl=01
## 4760 http://ntusweety.herokuapp.com/history?&id=901+10110&cl=02
## 4761 http://ntusweety.herokuapp.com/history?&id=901E10110&cl=03
## 4762 http://ntusweety.herokuapp.com/history?&id=901+10110&cl=04
## 4763 http://ntusweety.herokuapp.com/history?&id=901+10110&cl=05
## 4764   http://ntusweety.herokuapp.com/history?&id=901+20320&cl=
## 4765 http://ntusweety.herokuapp.com/history?&id=901+21000&cl=01
## 4766 http://ntusweety.herokuapp.com/history?&id=901+21000&cl=02
## 4767 http://ntusweety.herokuapp.com/history?&id=901+21000&cl=03
## 4768 http://ntusweety.herokuapp.com/history?&id=901E21000&cl=04
## 4769 http://ntusweety.herokuapp.com/history?&id=901+21100&cl=01
## 4770 http://ntusweety.herokuapp.com/history?&id=901+21100&cl=02
## 4771   http://ntusweety.herokuapp.com/history?&id=901+24120&cl=
## 4772 http://ntusweety.herokuapp.com/history?&id=901+25110&cl=01
## 4773 http://ntusweety.herokuapp.com/history?&id=901+25110&cl=02
## 4774 http://ntusweety.herokuapp.com/history?&id=901+25110&cl=03
## 4775 http://ntusweety.herokuapp.com/history?&id=901+25110&cl=04
## 4776   http://ntusweety.herokuapp.com/history?&id=901+30020&cl=
## 4777   http://ntusweety.herokuapp.com/history?&id=901+30030&cl=
## 4778   http://ntusweety.herokuapp.com/history?&id=901+30150&cl=
## 4779   http://ntusweety.herokuapp.com/history?&id=901+30160&cl=
## 4780   http://ntusweety.herokuapp.com/history?&id=901+30800&cl=
## 4781   http://ntusweety.herokuapp.com/history?&id=901+31000&cl=
## 4782   http://ntusweety.herokuapp.com/history?&id=901+31100&cl=
## 4783   http://ntusweety.herokuapp.com/history?&id=901+31110&cl=
## 4784 http://ntusweety.herokuapp.com/history?&id=901+31400&cl=01
## 4785 http://ntusweety.herokuapp.com/history?&id=901+31400&cl=02
## 4786 http://ntusweety.herokuapp.com/history?&id=901+31400&cl=03
## 4787   http://ntusweety.herokuapp.com/history?&id=901+31700&cl=
## 4788   http://ntusweety.herokuapp.com/history?&id=901+31800&cl=
## 4789   http://ntusweety.herokuapp.com/history?&id=901+31900&cl=
## 4790   http://ntusweety.herokuapp.com/history?&id=901E32000&cl=
## 4791   http://ntusweety.herokuapp.com/history?&id=901+33320&cl=
## 4792   http://ntusweety.herokuapp.com/history?&id=901+33700&cl=
## 4793   http://ntusweety.herokuapp.com/history?&id=901+33800&cl=
## 4794 http://ntusweety.herokuapp.com/history?&id=901+34120&cl=01
## 4795 http://ntusweety.herokuapp.com/history?&id=901+34120&cl=02
## 4796 http://ntusweety.herokuapp.com/history?&id=901+34120&cl=03
## 4797 http://ntusweety.herokuapp.com/history?&id=901+34120&cl=04
## 4798   http://ntusweety.herokuapp.com/history?&id=901+37000&cl=
## 4799   http://ntusweety.herokuapp.com/history?&id=901+37300&cl=
## 4800   http://ntusweety.herokuapp.com/history?&id=901+37500&cl=
## 4801   http://ntusweety.herokuapp.com/history?&id=901+38100&cl=
## 4802   http://ntusweety.herokuapp.com/history?&id=901+39000&cl=
## 4803   http://ntusweety.herokuapp.com/history?&id=901+39500&cl=
## 4804   http://ntusweety.herokuapp.com/history?&id=901+39700&cl=
## 4805   http://ntusweety.herokuapp.com/history?&id=901+39800&cl=
## 4806   http://ntusweety.herokuapp.com/history?&id=901+40000&cl=
## 4807   http://ntusweety.herokuapp.com/history?&id=901+40300&cl=
## 4808   http://ntusweety.herokuapp.com/history?&id=901+40500&cl=
## 4809   http://ntusweety.herokuapp.com/history?&id=901+40600&cl=
## 4810   http://ntusweety.herokuapp.com/history?&id=901+40700&cl=
## 4811   http://ntusweety.herokuapp.com/history?&id=901+40800&cl=
## 4812   http://ntusweety.herokuapp.com/history?&id=901+40900&cl=
## 4813   http://ntusweety.herokuapp.com/history?&id=901E43100&cl=
## 4814   http://ntusweety.herokuapp.com/history?&id=901+43200&cl=
## 4815   http://ntusweety.herokuapp.com/history?&id=901+43700&cl=
## 4816 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=01
## 4817 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=02
## 4818 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=03
## 4819 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=04
## 4820 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=05
## 4821 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=06
## 4822 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=07
## 4823 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=08
## 4824 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=09
## 4825 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=10
## 4826 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=11
## 4827 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=12
## 4828 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=13
## 4829 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=15
## 4830 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=17
## 4831 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=18
## 4832 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=19
## 4833 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=20
## 4834 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=21
## 4835 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=22
## 4836 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=23
## 4837 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=24
## 4838 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=26
## 4839 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=27
## 4840 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=28
## 4841 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=29
## 4842 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=31
## 4843 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=32
## 4844 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=33
## 4845 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=34
## 4846 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=35
## 4847 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=36
## 4848 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=37
## 4849 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=38
## 4850 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=39
## 4851 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=40
## 4852 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=41
## 4853 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=42
## 4854 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=43
## 4855 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=44
## 4856 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=45
## 4857 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=46
## 4858 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=47
## 4859 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=48
## 4860 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=49
## 4861 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=50
## 4862 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=51
## 4863 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=52
## 4864 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=53
## 4865 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=54
## 4866 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=55
## 4867 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=56
## 4868 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=57
## 4869 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=58
## 4870 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=59
## 4871 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=60
## 4872 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=61
## 4873 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=62
## 4874 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=63
## 4875 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=64
## 4876 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=65
## 4877 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=66
## 4878 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=67
## 4879 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=68
## 4880 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=69
## 4881 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=70
## 4882 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=71
## 4883 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=72
## 4884 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=73
## 4885 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=74
## 4886 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=75
## 4887 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=76
## 4888 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=77
## 4889 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=78
## 4890 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=79
## 4891 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=80
## 4892 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=81
## 4893 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=82
## 4894 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=83
## 4895 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=84
## 4896 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=85
## 4897 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=86
## 4898 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=87
## 4899 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=88
## 4900 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=89
## 4901 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=90
## 4902 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=91
## 4903 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=92
## 4904 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=93
## 4905 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=94
## 4906 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=95
## 4907 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=96
## 4908 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=97
## 4909 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=98
## 4910 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=99
## 4911 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A1
## 4912 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A2
## 4913 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A3
## 4914 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A4
## 4915 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A5
## 4916 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A6
## 4917 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A7
## 4918 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A8
## 4919 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=A9
## 4920 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B1
## 4921 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B2
## 4922 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B3
## 4923 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B4
## 4924 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B5
## 4925 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B6
## 4926 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B7
## 4927 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B8
## 4928 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=B9
## 4929 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=C1
## 4930 http://ntusweety.herokuapp.com/history?&id=901+49550&cl=C2
## 4931   http://ntusweety.herokuapp.com/history?&id=901+50200&cl=
## 4932 http://ntusweety.herokuapp.com/history?&id=901+60200&cl=01
## 4933 http://ntusweety.herokuapp.com/history?&id=902+10750&cl=01
## 4934 http://ntusweety.herokuapp.com/history?&id=902+10750&cl=02
## 4935 http://ntusweety.herokuapp.com/history?&id=902+21610&cl=01
## 4936 http://ntusweety.herokuapp.com/history?&id=902+21610&cl=02
## 4937 http://ntusweety.herokuapp.com/history?&id=902+25200&cl=01
## 4938 http://ntusweety.herokuapp.com/history?&id=902E25200&cl=02
## 4939 http://ntusweety.herokuapp.com/history?&id=902+25600&cl=01
## 4940 http://ntusweety.herokuapp.com/history?&id=902+25600&cl=02
## 4941 http://ntusweety.herokuapp.com/history?&id=902+36700&cl=01
## 4942 http://ntusweety.herokuapp.com/history?&id=902+36700&cl=02
## 4943 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=05
## 4944 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=11
## 4945 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=13
## 4946 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=14
## 4947 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=16
## 4948 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=18
## 4949 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=20
## 4950 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=21
## 4951 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=22
## 4952 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=23
## 4953 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=26
## 4954 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=27
## 4955 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=29
## 4956 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=33
## 4957 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=34
## 4958 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=35
## 4959 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=36
## 4960 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=37
## 4961 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=38
## 4962 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=39
## 4963 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=40
## 4964 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=43
## 4965 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=44
## 4966 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=46
## 4967 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=47
## 4968 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=50
## 4969 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=51
## 4970 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=52
## 4971 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=53
## 4972 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=54
## 4973 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=55
## 4974 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=56
## 4975 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=57
## 4976 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=59
## 4977 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=60
## 4978 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=62
## 4979 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=63
## 4980 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=64
## 4981 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=65
## 4982 http://ntusweety.herokuapp.com/history?&id=902+37000&cl=66
## 4983   http://ntusweety.herokuapp.com/history?&id=902+39120&cl=
## 4984   http://ntusweety.herokuapp.com/history?&id=902+39900&cl=
## 4985   http://ntusweety.herokuapp.com/history?&id=902+48040&cl=
## 4986   http://ntusweety.herokuapp.com/history?&id=902+48080&cl=
## 4987   http://ntusweety.herokuapp.com/history?&id=921+D0010&cl=
## 4988 http://ntusweety.herokuapp.com/history?&id=921ED0040&cl=06
## 4989 http://ntusweety.herokuapp.com/history?&id=921+D0040&cl=07
## 4990 http://ntusweety.herokuapp.com/history?&id=921+D0040&cl=08
## 4991   http://ntusweety.herokuapp.com/history?&id=921+M0010&cl=
## 4992 http://ntusweety.herokuapp.com/history?&id=921EM0040&cl=06
## 4993 http://ntusweety.herokuapp.com/history?&id=921+M0040&cl=07
## 4994 http://ntusweety.herokuapp.com/history?&id=921+M0040&cl=08
## 4995   http://ntusweety.herokuapp.com/history?&id=921+M1000&cl=
## 4996   http://ntusweety.herokuapp.com/history?&id=921EM1380&cl=
## 4997   http://ntusweety.herokuapp.com/history?&id=921+M3100&cl=
## 4998   http://ntusweety.herokuapp.com/history?&id=921+M6100&cl=
## 4999   http://ntusweety.herokuapp.com/history?&id=921EU0020&cl=
## 5000   http://ntusweety.herokuapp.com/history?&id=921+U0500&cl=
## 5001   http://ntusweety.herokuapp.com/history?&id=921+U0640&cl=
## 5002   http://ntusweety.herokuapp.com/history?&id=921+U0790&cl=
## 5003   http://ntusweety.herokuapp.com/history?&id=921+U1560&cl=
## 5004   http://ntusweety.herokuapp.com/history?&id=921+U1930&cl=
## 5005   http://ntusweety.herokuapp.com/history?&id=921EU1980&cl=
## 5006   http://ntusweety.herokuapp.com/history?&id=921EU2310&cl=
## 5007   http://ntusweety.herokuapp.com/history?&id=921+U2330&cl=
## 5008   http://ntusweety.herokuapp.com/history?&id=921+U2480&cl=
## 5009   http://ntusweety.herokuapp.com/history?&id=921+U2800&cl=
## 5010   http://ntusweety.herokuapp.com/history?&id=921+U3090&cl=
## 5011   http://ntusweety.herokuapp.com/history?&id=921EU4350&cl=
## 5012   http://ntusweety.herokuapp.com/history?&id=921+U4370&cl=
## 5013   http://ntusweety.herokuapp.com/history?&id=921+U6110&cl=
## 5014   http://ntusweety.herokuapp.com/history?&id=921+U7110&cl=
## 5015   http://ntusweety.herokuapp.com/history?&id=921+U7120&cl=
## 5016   http://ntusweety.herokuapp.com/history?&id=921+U7150&cl=
## 5017   http://ntusweety.herokuapp.com/history?&id=921+U7800&cl=
## 5018   http://ntusweety.herokuapp.com/history?&id=921EU8300&cl=
## 5019   http://ntusweety.herokuapp.com/history?&id=921+U8910&cl=
## 5020   http://ntusweety.herokuapp.com/history?&id=921+U9090&cl=
## 5021   http://ntusweety.herokuapp.com/history?&id=921+U9230&cl=
## 5022   http://ntusweety.herokuapp.com/history?&id=921+U9360&cl=
## 5023   http://ntusweety.herokuapp.com/history?&id=921+U9750&cl=
## 5024   http://ntusweety.herokuapp.com/history?&id=922+D0010&cl=
## 5025   http://ntusweety.herokuapp.com/history?&id=922+D0030&cl=
## 5026 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=11
## 5027 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=13
## 5028 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=16
## 5029 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=18
## 5030 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=20
## 5031 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=21
## 5032 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=22
## 5033 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=23
## 5034 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=26
## 5035 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=27
## 5036 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=29
## 5037 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=31
## 5038 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=32
## 5039 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=33
## 5040 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=34
## 5041 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=35
## 5042 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=36
## 5043 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=37
## 5044 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=38
## 5045 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=39
## 5046 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=40
## 5047 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=43
## 5048 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=44
## 5049 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=46
## 5050 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=47
## 5051 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=50
## 5052 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=51
## 5053 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=52
## 5054 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=53
## 5055 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=54
## 5056 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=55
## 5057 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=56
## 5058 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=57
## 5059 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=58
## 5060 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=59
## 5061 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=60
## 5062 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=62
## 5063 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=63
## 5064 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=64
## 5065 http://ntusweety.herokuapp.com/history?&id=922+D0100&cl=65
## 5066   http://ntusweety.herokuapp.com/history?&id=922+M0010&cl=
## 5067 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=05
## 5068 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=11
## 5069 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=13
## 5070 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=14
## 5071 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=16
## 5072 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=18
## 5073 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=20
## 5074 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=21
## 5075 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=22
## 5076 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=23
## 5077 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=26
## 5078 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=27
## 5079 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=29
## 5080 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=31
## 5081 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=32
## 5082 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=33
## 5083 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=34
## 5084 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=35
## 5085 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=36
## 5086 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=37
## 5087 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=38
## 5088 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=39
## 5089 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=40
## 5090 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=43
## 5091 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=44
## 5092 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=46
## 5093 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=47
## 5094 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=50
## 5095 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=51
## 5096 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=52
## 5097 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=53
## 5098 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=54
## 5099 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=55
## 5100 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=56
## 5101 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=57
## 5102 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=58
## 5103 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=59
## 5104 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=60
## 5105 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=62
## 5106 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=63
## 5107 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=64
## 5108 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=65
## 5109 http://ntusweety.herokuapp.com/history?&id=922+M0020&cl=66
## 5110   http://ntusweety.herokuapp.com/history?&id=922+M0030&cl=
## 5111 http://ntusweety.herokuapp.com/history?&id=922+M0030&cl=02
## 5112   http://ntusweety.herokuapp.com/history?&id=922+M1360&cl=
## 5113   http://ntusweety.herokuapp.com/history?&id=922+U0100&cl=
## 5114   http://ntusweety.herokuapp.com/history?&id=922+U0240&cl=
## 5115   http://ntusweety.herokuapp.com/history?&id=922+U0270&cl=
## 5116   http://ntusweety.herokuapp.com/history?&id=922EU0280&cl=
## 5117   http://ntusweety.herokuapp.com/history?&id=922+U0670&cl=
## 5118   http://ntusweety.herokuapp.com/history?&id=922+U0830&cl=
## 5119   http://ntusweety.herokuapp.com/history?&id=922+U1030&cl=
## 5120   http://ntusweety.herokuapp.com/history?&id=922+U1220&cl=
## 5121   http://ntusweety.herokuapp.com/history?&id=922+U1330&cl=
## 5122   http://ntusweety.herokuapp.com/history?&id=922+U1470&cl=
## 5123   http://ntusweety.herokuapp.com/history?&id=922+U1520&cl=
## 5124   http://ntusweety.herokuapp.com/history?&id=922+U1600&cl=
## 5125   http://ntusweety.herokuapp.com/history?&id=922EU1940&cl=
## 5126   http://ntusweety.herokuapp.com/history?&id=922+U3030&cl=
## 5127   http://ntusweety.herokuapp.com/history?&id=922+U3120&cl=
## 5128   http://ntusweety.herokuapp.com/history?&id=922+U3150&cl=
## 5129   http://ntusweety.herokuapp.com/history?&id=922+U3390&cl=
## 5130   http://ntusweety.herokuapp.com/history?&id=922+U3480&cl=
## 5131   http://ntusweety.herokuapp.com/history?&id=922+U3640&cl=
## 5132   http://ntusweety.herokuapp.com/history?&id=922+U3660&cl=
## 5133   http://ntusweety.herokuapp.com/history?&id=922+U3680&cl=
## 5134   http://ntusweety.herokuapp.com/history?&id=922+U3700&cl=
## 5135   http://ntusweety.herokuapp.com/history?&id=922+U3740&cl=
## 5136   http://ntusweety.herokuapp.com/history?&id=922+U3890&cl=
## 5137   http://ntusweety.herokuapp.com/history?&id=922+U3900&cl=
## 5138   http://ntusweety.herokuapp.com/history?&id=922+U3910&cl=
## 5139   http://ntusweety.herokuapp.com/history?&id=922EU3920&cl=
## 5140   http://ntusweety.herokuapp.com/history?&id=922EU3940&cl=
## 5141   http://ntusweety.herokuapp.com/history?&id=922+U4060&cl=
## 5142   http://ntusweety.herokuapp.com/history?&id=922+U4080&cl=
## 5143   http://ntusweety.herokuapp.com/history?&id=922EU4120&cl=
## 5144   http://ntusweety.herokuapp.com/history?&id=922+U4140&cl=
## 5145   http://ntusweety.herokuapp.com/history?&id=941+D0010&cl=
## 5146 http://ntusweety.herokuapp.com/history?&id=941ED0050&cl=01
## 5147   http://ntusweety.herokuapp.com/history?&id=941+M0010&cl=
## 5148 http://ntusweety.herokuapp.com/history?&id=941+M0050&cl=01
## 5149 http://ntusweety.herokuapp.com/history?&id=941+M0050&cl=02
## 5150   http://ntusweety.herokuapp.com/history?&id=941+U0090&cl=
## 5151   http://ntusweety.herokuapp.com/history?&id=941EU0140&cl=
## 5152   http://ntusweety.herokuapp.com/history?&id=941+U0160&cl=
## 5153   http://ntusweety.herokuapp.com/history?&id=941EU0220&cl=
## 5154   http://ntusweety.herokuapp.com/history?&id=941+U0240&cl=
## 5155   http://ntusweety.herokuapp.com/history?&id=941+U0250&cl=
## 5156   http://ntusweety.herokuapp.com/history?&id=941+U0260&cl=
## 5157   http://ntusweety.herokuapp.com/history?&id=941+U0300&cl=
## 5158   http://ntusweety.herokuapp.com/history?&id=941+U0340&cl=
## 5159   http://ntusweety.herokuapp.com/history?&id=941+U0390&cl=
## 5160   http://ntusweety.herokuapp.com/history?&id=941EU0430&cl=
## 5161   http://ntusweety.herokuapp.com/history?&id=941+U0460&cl=
## 5162   http://ntusweety.herokuapp.com/history?&id=941+U0580&cl=
## 5163   http://ntusweety.herokuapp.com/history?&id=942+D0010&cl=
## 5164 http://ntusweety.herokuapp.com/history?&id=942+D0050&cl=01
## 5165 http://ntusweety.herokuapp.com/history?&id=942+D0050&cl=02
## 5166   http://ntusweety.herokuapp.com/history?&id=942+M0010&cl=
## 5167 http://ntusweety.herokuapp.com/history?&id=942+M0050&cl=01
## 5168 http://ntusweety.herokuapp.com/history?&id=942+M0050&cl=02
## 5169   http://ntusweety.herokuapp.com/history?&id=942+U0120&cl=
## 5170   http://ntusweety.herokuapp.com/history?&id=942+U0130&cl=
## 5171   http://ntusweety.herokuapp.com/history?&id=942EU0140&cl=
## 5172   http://ntusweety.herokuapp.com/history?&id=942+U0340&cl=
## 5173   http://ntusweety.herokuapp.com/history?&id=942+U0540&cl=
## 5174   http://ntusweety.herokuapp.com/history?&id=942+U0560&cl=
## 5175   http://ntusweety.herokuapp.com/history?&id=943+D0010&cl=
## 5176   http://ntusweety.herokuapp.com/history?&id=943+M0010&cl=
## 5177   http://ntusweety.herokuapp.com/history?&id=943+U0040&cl=
## 5178   http://ntusweety.herokuapp.com/history?&id=943+U0110&cl=
## 5179   http://ntusweety.herokuapp.com/history?&id=943+U0180&cl=
## 5180   http://ntusweety.herokuapp.com/history?&id=943+U0250&cl=
## 5181   http://ntusweety.herokuapp.com/history?&id=943+U0270&cl=
## 5182   http://ntusweety.herokuapp.com/history?&id=943+U0280&cl=
## 5183   http://ntusweety.herokuapp.com/history?&id=943+U0290&cl=
## 5184   http://ntusweety.herokuapp.com/history?&id=943+U0310&cl=
## 5185   http://ntusweety.herokuapp.com/history?&id=943+U0380&cl=
## 5186   http://ntusweety.herokuapp.com/history?&id=943+U0400&cl=
## 5187   http://ntusweety.herokuapp.com/history?&id=943+U0440&cl=
## 5188   http://ntusweety.herokuapp.com/history?&id=944+D0010&cl=
## 5189 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=01
## 5190 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=02
## 5191 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=04
## 5192 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=05
## 5193 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=06
## 5194 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=07
## 5195 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=10
## 5196 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=13
## 5197 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=15
## 5198 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=16
## 5199 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=17
## 5200 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=18
## 5201 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=19
## 5202 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=26
## 5203 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=33
## 5204 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=36
## 5205 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=37
## 5206 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=40
## 5207 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=43
## 5208 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=44
## 5209 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=45
## 5210 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=46
## 5211 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=47
## 5212 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=48
## 5213 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=53
## 5214 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=54
## 5215 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=58
## 5216 http://ntusweety.herokuapp.com/history?&id=944+D0020&cl=62
## 5217   http://ntusweety.herokuapp.com/history?&id=944+D0030&cl=
## 5218   http://ntusweety.herokuapp.com/history?&id=944+M0010&cl=
## 5219 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=01
## 5220 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=02
## 5221 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=04
## 5222 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=05
## 5223 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=06
## 5224 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=07
## 5225 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=08
## 5226 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=10
## 5227 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=12
## 5228 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=13
## 5229 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=14
## 5230 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=15
## 5231 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=16
## 5232 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=17
## 5233 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=18
## 5234 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=19
## 5235 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=26
## 5236 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=33
## 5237 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=35
## 5238 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=36
## 5239 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=37
## 5240 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=40
## 5241 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=41
## 5242 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=42
## 5243 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=43
## 5244 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=44
## 5245 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=45
## 5246 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=46
## 5247 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=47
## 5248 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=48
## 5249 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=49
## 5250 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=50
## 5251 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=53
## 5252 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=54
## 5253 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=58
## 5254 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=59
## 5255 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=61
## 5256 http://ntusweety.herokuapp.com/history?&id=944+M0020&cl=62
## 5257   http://ntusweety.herokuapp.com/history?&id=944+M0030&cl=
## 5258   http://ntusweety.herokuapp.com/history?&id=944+U0010&cl=
## 5259   http://ntusweety.herokuapp.com/history?&id=944EU0120&cl=
## 5260   http://ntusweety.herokuapp.com/history?&id=945+D0010&cl=
## 5261 http://ntusweety.herokuapp.com/history?&id=945+D0040&cl=01
## 5262 http://ntusweety.herokuapp.com/history?&id=945+D0040&cl=02
## 5263   http://ntusweety.herokuapp.com/history?&id=945+M0010&cl=
## 5264 http://ntusweety.herokuapp.com/history?&id=945+M0040&cl=01
## 5265 http://ntusweety.herokuapp.com/history?&id=945+M0040&cl=02
## 5266   http://ntusweety.herokuapp.com/history?&id=945+M2900&cl=
## 5267   http://ntusweety.herokuapp.com/history?&id=945+U2950&cl=
## 5268   http://ntusweety.herokuapp.com/history?&id=A01+10500&cl=
## 5269   http://ntusweety.herokuapp.com/history?&id=A01+11110&cl=
## 5270   http://ntusweety.herokuapp.com/history?&id=A01+25200&cl=
## 5271 http://ntusweety.herokuapp.com/history?&id=A01+25240&cl=01
## 5272 http://ntusweety.herokuapp.com/history?&id=A01+25240&cl=02
## 5273 http://ntusweety.herokuapp.com/history?&id=A01+25240&cl=03
## 5274 http://ntusweety.herokuapp.com/history?&id=A01+27130&cl=01
## 5275 http://ntusweety.herokuapp.com/history?&id=A01+27130&cl=02
## 5276   http://ntusweety.herokuapp.com/history?&id=A01+28150&cl=
## 5277   http://ntusweety.herokuapp.com/history?&id=A01+28160&cl=
## 5278   http://ntusweety.herokuapp.com/history?&id=A01+28200&cl=
## 5279   http://ntusweety.herokuapp.com/history?&id=A01+28330&cl=
## 5280   http://ntusweety.herokuapp.com/history?&id=A01+28510&cl=
## 5281   http://ntusweety.herokuapp.com/history?&id=A01+30200&cl=
## 5282   http://ntusweety.herokuapp.com/history?&id=A01+30500&cl=
## 5283   http://ntusweety.herokuapp.com/history?&id=A01+31350&cl=
## 5284   http://ntusweety.herokuapp.com/history?&id=A01+31440&cl=
## 5285   http://ntusweety.herokuapp.com/history?&id=A01+31680&cl=
## 5286 http://ntusweety.herokuapp.com/history?&id=A01+33120&cl=01
## 5287 http://ntusweety.herokuapp.com/history?&id=A01+33120&cl=02
## 5288 http://ntusweety.herokuapp.com/history?&id=A01+35310&cl=01
## 5289 http://ntusweety.herokuapp.com/history?&id=A01+361A2&cl=02
## 5290   http://ntusweety.herokuapp.com/history?&id=A01+36200&cl=
## 5291 http://ntusweety.herokuapp.com/history?&id=A01+38400&cl=01
## 5292 http://ntusweety.herokuapp.com/history?&id=A01+38400&cl=02
## 5293 http://ntusweety.herokuapp.com/history?&id=A01+38400&cl=03
## 5294   http://ntusweety.herokuapp.com/history?&id=A01+39000&cl=
## 5295   http://ntusweety.herokuapp.com/history?&id=A01E39100&cl=
## 5296   http://ntusweety.herokuapp.com/history?&id=A01+39900&cl=
## 5297 http://ntusweety.herokuapp.com/history?&id=A01+40210&cl=01
## 5298 http://ntusweety.herokuapp.com/history?&id=A01+40210&cl=02
## 5299   http://ntusweety.herokuapp.com/history?&id=A01+40220&cl=
## 5300   http://ntusweety.herokuapp.com/history?&id=A01+40230&cl=
## 5301   http://ntusweety.herokuapp.com/history?&id=A01+40240&cl=
## 5302 http://ntusweety.herokuapp.com/history?&id=A01+40510&cl=01
## 5303 http://ntusweety.herokuapp.com/history?&id=A01+40510&cl=02
## 5304 http://ntusweety.herokuapp.com/history?&id=A01+40520&cl=01
## 5305 http://ntusweety.herokuapp.com/history?&id=A01+40520&cl=02
## 5306 http://ntusweety.herokuapp.com/history?&id=A01+40530&cl=01
## 5307 http://ntusweety.herokuapp.com/history?&id=A01+40530&cl=02
## 5308 http://ntusweety.herokuapp.com/history?&id=A01+40540&cl=01
## 5309 http://ntusweety.herokuapp.com/history?&id=A01+40540&cl=02
## 5310   http://ntusweety.herokuapp.com/history?&id=A01+40710&cl=
## 5311   http://ntusweety.herokuapp.com/history?&id=A01+40720&cl=
## 5312   http://ntusweety.herokuapp.com/history?&id=A01+40730&cl=
## 5313   http://ntusweety.herokuapp.com/history?&id=A01+40740&cl=
## 5314   http://ntusweety.herokuapp.com/history?&id=A01+40910&cl=
## 5315   http://ntusweety.herokuapp.com/history?&id=A01+40920&cl=
## 5316   http://ntusweety.herokuapp.com/history?&id=A01+43060&cl=
## 5317   http://ntusweety.herokuapp.com/history?&id=A01+43240&cl=
## 5318   http://ntusweety.herokuapp.com/history?&id=A01+43900&cl=
## 5319   http://ntusweety.herokuapp.com/history?&id=A01+45200&cl=
## 5320 http://ntusweety.herokuapp.com/history?&id=A01+47702&cl=01
## 5321 http://ntusweety.herokuapp.com/history?&id=A01+47702&cl=02
## 5322 http://ntusweety.herokuapp.com/history?&id=A01+47802&cl=01
## 5323 http://ntusweety.herokuapp.com/history?&id=A01+47802&cl=02
## 5324   http://ntusweety.herokuapp.com/history?&id=A01+49930&cl=
## 5325   http://ntusweety.herokuapp.com/history?&id=A01+50420&cl=
## 5326   http://ntusweety.herokuapp.com/history?&id=A21+D0010&cl=
## 5327   http://ntusweety.herokuapp.com/history?&id=A21+M0010&cl=
## 5328   http://ntusweety.herokuapp.com/history?&id=A21+M0700&cl=
## 5329   http://ntusweety.herokuapp.com/history?&id=A21+M0810&cl=
## 5330   http://ntusweety.herokuapp.com/history?&id=A21+M1300&cl=
## 5331   http://ntusweety.herokuapp.com/history?&id=A21+M1350&cl=
## 5332   http://ntusweety.herokuapp.com/history?&id=A21+M1410&cl=
## 5333   http://ntusweety.herokuapp.com/history?&id=A21+M1420&cl=
## 5334   http://ntusweety.herokuapp.com/history?&id=A21+M1450&cl=
## 5335   http://ntusweety.herokuapp.com/history?&id=A21+M1460&cl=
## 5336   http://ntusweety.herokuapp.com/history?&id=A21+M1470&cl=
## 5337   http://ntusweety.herokuapp.com/history?&id=A21+M1480&cl=
## 5338   http://ntusweety.herokuapp.com/history?&id=A21+M1490&cl=
## 5339   http://ntusweety.herokuapp.com/history?&id=A21+M3210&cl=
## 5340   http://ntusweety.herokuapp.com/history?&id=A21+M4490&cl=
## 5341   http://ntusweety.herokuapp.com/history?&id=A21+M5070&cl=
## 5342   http://ntusweety.herokuapp.com/history?&id=A21+M5080&cl=
## 5343   http://ntusweety.herokuapp.com/history?&id=A21+M5090&cl=
## 5344   http://ntusweety.herokuapp.com/history?&id=A21+M5100&cl=
## 5345   http://ntusweety.herokuapp.com/history?&id=A21+M5110&cl=
## 5346   http://ntusweety.herokuapp.com/history?&id=A21+M5120&cl=
## 5347   http://ntusweety.herokuapp.com/history?&id=A21+M5210&cl=
## 5348   http://ntusweety.herokuapp.com/history?&id=A21+M5310&cl=
## 5349   http://ntusweety.herokuapp.com/history?&id=A21+M5320&cl=
## 5350   http://ntusweety.herokuapp.com/history?&id=A21+M5330&cl=
## 5351   http://ntusweety.herokuapp.com/history?&id=A21+M5340&cl=
## 5352   http://ntusweety.herokuapp.com/history?&id=A21EM5350&cl=
## 5353   http://ntusweety.herokuapp.com/history?&id=A21EM5360&cl=
## 5354   http://ntusweety.herokuapp.com/history?&id=A21EM5370&cl=
## 5355   http://ntusweety.herokuapp.com/history?&id=A21+M5510&cl=
## 5356   http://ntusweety.herokuapp.com/history?&id=A21+M5520&cl=
## 5357   http://ntusweety.herokuapp.com/history?&id=A21+M5530&cl=
## 5358   http://ntusweety.herokuapp.com/history?&id=A21+M5540&cl=
## 5359   http://ntusweety.herokuapp.com/history?&id=A21+M5810&cl=
## 5360   http://ntusweety.herokuapp.com/history?&id=A21+M5820&cl=
## 5361   http://ntusweety.herokuapp.com/history?&id=A21+M5830&cl=
## 5362   http://ntusweety.herokuapp.com/history?&id=A21+M5840&cl=
## 5363   http://ntusweety.herokuapp.com/history?&id=A21+M6000&cl=
## 5364   http://ntusweety.herokuapp.com/history?&id=A21+M6200&cl=
## 5365   http://ntusweety.herokuapp.com/history?&id=A21+M6690&cl=
## 5366   http://ntusweety.herokuapp.com/history?&id=A21+M6700&cl=
## 5367   http://ntusweety.herokuapp.com/history?&id=A21+M6790&cl=
## 5368   http://ntusweety.herokuapp.com/history?&id=A21+M7910&cl=
## 5369   http://ntusweety.herokuapp.com/history?&id=A21+M7920&cl=
## 5370   http://ntusweety.herokuapp.com/history?&id=A21+M7930&cl=
## 5371   http://ntusweety.herokuapp.com/history?&id=A21+M7940&cl=
## 5372   http://ntusweety.herokuapp.com/history?&id=A21+M8010&cl=
## 5373   http://ntusweety.herokuapp.com/history?&id=A21+M8020&cl=
## 5374   http://ntusweety.herokuapp.com/history?&id=A21+M8030&cl=
## 5375   http://ntusweety.herokuapp.com/history?&id=A21+M8040&cl=
## 5376   http://ntusweety.herokuapp.com/history?&id=A21+M8310&cl=
## 5377   http://ntusweety.herokuapp.com/history?&id=A21+M8320&cl=
## 5378   http://ntusweety.herokuapp.com/history?&id=A21+M8330&cl=
## 5379   http://ntusweety.herokuapp.com/history?&id=A21+M8340&cl=
## 5380   http://ntusweety.herokuapp.com/history?&id=A21+M8950&cl=
## 5381   http://ntusweety.herokuapp.com/history?&id=A21+M8960&cl=
## 5382   http://ntusweety.herokuapp.com/history?&id=A21+M8970&cl=
## 5383   http://ntusweety.herokuapp.com/history?&id=A21+M8980&cl=
## 5384   http://ntusweety.herokuapp.com/history?&id=A21+M9390&cl=
## 5385   http://ntusweety.herokuapp.com/history?&id=A21+M9710&cl=
## 5386   http://ntusweety.herokuapp.com/history?&id=A21+M9720&cl=
## 5387   http://ntusweety.herokuapp.com/history?&id=A21+M9880&cl=
## 5388   http://ntusweety.herokuapp.com/history?&id=A21+M9900&cl=
## 5389   http://ntusweety.herokuapp.com/history?&id=A21+M9910&cl=
## 5390   http://ntusweety.herokuapp.com/history?&id=A21+M9960&cl=
## 5391   http://ntusweety.herokuapp.com/history?&id=A21+M9980&cl=
## 5392   http://ntusweety.herokuapp.com/history?&id=A21+M9990&cl=
## 5393   http://ntusweety.herokuapp.com/history?&id=A21+U0620&cl=
## 5394   http://ntusweety.herokuapp.com/history?&id=A21+U0720&cl=
## 5395   http://ntusweety.herokuapp.com/history?&id=A21+U1780&cl=
## 5396   http://ntusweety.herokuapp.com/history?&id=A21+U2130&cl=
## 5397   http://ntusweety.herokuapp.com/history?&id=A21+U2140&cl=
## 5398   http://ntusweety.herokuapp.com/history?&id=A21+U4310&cl=
## 5399   http://ntusweety.herokuapp.com/history?&id=A21+U4320&cl=
## 5400   http://ntusweety.herokuapp.com/history?&id=A21EU4420&cl=
## 5401   http://ntusweety.herokuapp.com/history?&id=A21+U4470&cl=
## 5402   http://ntusweety.herokuapp.com/history?&id=A21EU5100&cl=
## 5403   http://ntusweety.herokuapp.com/history?&id=A21EU5110&cl=
## 5404   http://ntusweety.herokuapp.com/history?&id=A21+U6580&cl=
## 5405   http://ntusweety.herokuapp.com/history?&id=A41+M0010&cl=
## 5406   http://ntusweety.herokuapp.com/history?&id=A41+M0142&cl=
## 5407   http://ntusweety.herokuapp.com/history?&id=A41+M0160&cl=
## 5408   http://ntusweety.herokuapp.com/history?&id=A41+M0180&cl=
## 5409   http://ntusweety.herokuapp.com/history?&id=A41+M0210&cl=
## 5410   http://ntusweety.herokuapp.com/history?&id=A41+M0310&cl=
## 5411   http://ntusweety.herokuapp.com/history?&id=B00EU0120&cl=
## 5412 http://ntusweety.herokuapp.com/history?&id=B01+101A2&cl=01
## 5413 http://ntusweety.herokuapp.com/history?&id=B01+101B0&cl=01
## 5414 http://ntusweety.herokuapp.com/history?&id=B01+101B2&cl=01
## 5415 http://ntusweety.herokuapp.com/history?&id=B01+101B2&cl=02
## 5416 http://ntusweety.herokuapp.com/history?&id=B01+101B2&cl=03
## 5417 http://ntusweety.herokuapp.com/history?&id=B01+101B2&cl=05
## 5418 http://ntusweety.herokuapp.com/history?&id=B01+101C0&cl=01
## 5419 http://ntusweety.herokuapp.com/history?&id=B01+101C0&cl=02
## 5420 http://ntusweety.herokuapp.com/history?&id=B01+10200&cl=01
## 5421 http://ntusweety.herokuapp.com/history?&id=B01+106A2&cl=01
## 5422 http://ntusweety.herokuapp.com/history?&id=B01+106A2&cl=02
## 5423 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=01
## 5424 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=02
## 5425 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=03
## 5426 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=04
## 5427 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=05
## 5428 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=06
## 5429 http://ntusweety.herokuapp.com/history?&id=B01+106B2&cl=07
## 5430 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=01
## 5431 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=02
## 5432 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=03
## 5433 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=04
## 5434 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=05
## 5435 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=06
## 5436 http://ntusweety.herokuapp.com/history?&id=B01+106C0&cl=07
## 5437 http://ntusweety.herokuapp.com/history?&id=B01+10700&cl=01
## 5438 http://ntusweety.herokuapp.com/history?&id=B01+10700&cl=02
## 5439 http://ntusweety.herokuapp.com/history?&id=B01+10800&cl=01
## 5440 http://ntusweety.herokuapp.com/history?&id=B01+10800&cl=02
## 5441   http://ntusweety.herokuapp.com/history?&id=B01+16300&cl=
## 5442   http://ntusweety.herokuapp.com/history?&id=B01+16800&cl=
## 5443   http://ntusweety.herokuapp.com/history?&id=B01+17030&cl=
## 5444   http://ntusweety.herokuapp.com/history?&id=B01+17210&cl=
## 5445   http://ntusweety.herokuapp.com/history?&id=B01+17500&cl=
## 5446   http://ntusweety.herokuapp.com/history?&id=B01+21110&cl=
## 5447   http://ntusweety.herokuapp.com/history?&id=B01+22010&cl=
## 5448   http://ntusweety.herokuapp.com/history?&id=B01+23010&cl=
## 5449   http://ntusweety.herokuapp.com/history?&id=B01+23020&cl=
## 5450   http://ntusweety.herokuapp.com/history?&id=B01+25060&cl=
## 5451 http://ntusweety.herokuapp.com/history?&id=B01+31120&cl=01
## 5452 http://ntusweety.herokuapp.com/history?&id=B01+31120&cl=02
## 5453 http://ntusweety.herokuapp.com/history?&id=B01+32410&cl=01
## 5454 http://ntusweety.herokuapp.com/history?&id=B01+32420&cl=01
## 5455 http://ntusweety.herokuapp.com/history?&id=B01+32420&cl=02
## 5456   http://ntusweety.herokuapp.com/history?&id=B01+32700&cl=
## 5457   http://ntusweety.herokuapp.com/history?&id=B01+34110&cl=
## 5458   http://ntusweety.herokuapp.com/history?&id=B01+34120&cl=
## 5459   http://ntusweety.herokuapp.com/history?&id=B01+34610&cl=
## 5460 http://ntusweety.herokuapp.com/history?&id=B01+40020&cl=01
## 5461 http://ntusweety.herokuapp.com/history?&id=B01+40020&cl=02
## 5462 http://ntusweety.herokuapp.com/history?&id=B01+40020&cl=03
## 5463   http://ntusweety.herokuapp.com/history?&id=B01+41030&cl=
## 5464 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=12
## 5465 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=13
## 5466 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=23
## 5467 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=26
## 5468 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=27
## 5469 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=44
## 5470 http://ntusweety.herokuapp.com/history?&id=B01+49000&cl=55
## 5471 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=03
## 5472 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=05
## 5473 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=06
## 5474 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=07
## 5475 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=08
## 5476 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=09
## 5477 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=10
## 5478 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=11
## 5479 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=12
## 5480 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=13
## 5481 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=14
## 5482 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=15
## 5483 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=16
## 5484 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=17
## 5485 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=18
## 5486 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=21
## 5487 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=22
## 5488 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=23
## 5489 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=24
## 5490 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=25
## 5491 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=26
## 5492 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=27
## 5493 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=31
## 5494 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=32
## 5495 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=33
## 5496 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=35
## 5497 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=36
## 5498 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=38
## 5499 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=43
## 5500 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=44
## 5501 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=45
## 5502 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=46
## 5503 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=50
## 5504 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=52
## 5505 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=53
## 5506 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=55
## 5507 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=57
## 5508 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=58
## 5509 http://ntusweety.herokuapp.com/history?&id=B01+49100&cl=59
## 5510 http://ntusweety.herokuapp.com/history?&id=B02+20110&cl=01
## 5511 http://ntusweety.herokuapp.com/history?&id=B02+20110&cl=02
## 5512   http://ntusweety.herokuapp.com/history?&id=B02+20202&cl=
## 5513   http://ntusweety.herokuapp.com/history?&id=B02+20302&cl=
## 5514 http://ntusweety.herokuapp.com/history?&id=B02+20320&cl=01
## 5515 http://ntusweety.herokuapp.com/history?&id=B02+20320&cl=02
## 5516   http://ntusweety.herokuapp.com/history?&id=B02+20330&cl=
## 5517   http://ntusweety.herokuapp.com/history?&id=B02+30100&cl=
## 5518   http://ntusweety.herokuapp.com/history?&id=B02+30180&cl=
## 5519   http://ntusweety.herokuapp.com/history?&id=B02+301B2&cl=
## 5520 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=02
## 5521 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=03
## 5522 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=06
## 5523 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=07
## 5524 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=08
## 5525 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=09
## 5526 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=11
## 5527 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=12
## 5528 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=13
## 5529 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=14
## 5530 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=15
## 5531 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=17
## 5532 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=19
## 5533 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=20
## 5534 http://ntusweety.herokuapp.com/history?&id=B02+41020&cl=24
## 5535   http://ntusweety.herokuapp.com/history?&id=B21+D0010&cl=
## 5536   http://ntusweety.herokuapp.com/history?&id=B21+M0010&cl=
## 5537   http://ntusweety.herokuapp.com/history?&id=B21+M0200&cl=
## 5538   http://ntusweety.herokuapp.com/history?&id=B21+M0310&cl=
## 5539   http://ntusweety.herokuapp.com/history?&id=B21+M0320&cl=
## 5540   http://ntusweety.herokuapp.com/history?&id=B21+M0330&cl=
## 5541   http://ntusweety.herokuapp.com/history?&id=B21+M0340&cl=
## 5542   http://ntusweety.herokuapp.com/history?&id=B21EM0380&cl=
## 5543   http://ntusweety.herokuapp.com/history?&id=B21+M0400&cl=
## 5544   http://ntusweety.herokuapp.com/history?&id=B21+M0420&cl=
## 5545   http://ntusweety.herokuapp.com/history?&id=B21+M0430&cl=
## 5546   http://ntusweety.herokuapp.com/history?&id=B21+M0440&cl=
## 5547   http://ntusweety.herokuapp.com/history?&id=B21+M0460&cl=
## 5548   http://ntusweety.herokuapp.com/history?&id=B21+M0470&cl=
## 5549   http://ntusweety.herokuapp.com/history?&id=B21+M0480&cl=
## 5550   http://ntusweety.herokuapp.com/history?&id=B21+M0490&cl=
## 5551   http://ntusweety.herokuapp.com/history?&id=B21+M1020&cl=
## 5552   http://ntusweety.herokuapp.com/history?&id=B21+U0300&cl=
## 5553   http://ntusweety.herokuapp.com/history?&id=B21+U0400&cl=
## 5554   http://ntusweety.herokuapp.com/history?&id=B21+U1130&cl=
## 5555   http://ntusweety.herokuapp.com/history?&id=B21+U1150&cl=
## 5556   http://ntusweety.herokuapp.com/history?&id=B21+U1410&cl=
## 5557   http://ntusweety.herokuapp.com/history?&id=B21+U1510&cl=
## 5558   http://ntusweety.herokuapp.com/history?&id=B21+U2190&cl=
## 5559   http://ntusweety.herokuapp.com/history?&id=B22+D0010&cl=
## 5560 http://ntusweety.herokuapp.com/history?&id=B22+D0020&cl=01
## 5561 http://ntusweety.herokuapp.com/history?&id=B22+D0020&cl=02
## 5562 http://ntusweety.herokuapp.com/history?&id=B22+D0020&cl=03
## 5563 http://ntusweety.herokuapp.com/history?&id=B22+D0020&cl=04
## 5564 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=01
## 5565 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=02
## 5566 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=04
## 5567 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=07
## 5568 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=11
## 5569 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=13
## 5570 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=15
## 5571 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=16
## 5572 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=19
## 5573 http://ntusweety.herokuapp.com/history?&id=B22+D1020&cl=20
## 5574 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=01
## 5575 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=02
## 5576 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=04
## 5577 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=07
## 5578 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=09
## 5579 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=11
## 5580 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=13
## 5581 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=15
## 5582 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=16
## 5583 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=17
## 5584 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=19
## 5585 http://ntusweety.herokuapp.com/history?&id=B22+D1040&cl=20
## 5586   http://ntusweety.herokuapp.com/history?&id=B22+D1050&cl=
## 5587   http://ntusweety.herokuapp.com/history?&id=B22+D1080&cl=
## 5588   http://ntusweety.herokuapp.com/history?&id=B22+D1090&cl=
## 5589   http://ntusweety.herokuapp.com/history?&id=B22+M0010&cl=
## 5590 http://ntusweety.herokuapp.com/history?&id=B22+M0020&cl=01
## 5591 http://ntusweety.herokuapp.com/history?&id=B22+M0020&cl=02
## 5592 http://ntusweety.herokuapp.com/history?&id=B22+M0020&cl=03
## 5593 http://ntusweety.herokuapp.com/history?&id=B22+M0020&cl=04
## 5594   http://ntusweety.herokuapp.com/history?&id=B22+M0040&cl=
## 5595   http://ntusweety.herokuapp.com/history?&id=B22+M0140&cl=
## 5596   http://ntusweety.herokuapp.com/history?&id=B22+M0150&cl=
## 5597 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=01
## 5598 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=02
## 5599 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=03
## 5600 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=04
## 5601 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=05
## 5602 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=06
## 5603 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=07
## 5604 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=08
## 5605 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=09
## 5606 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=10
## 5607 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=11
## 5608 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=13
## 5609 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=14
## 5610 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=15
## 5611 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=16
## 5612 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=17
## 5613 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=18
## 5614 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=19
## 5615 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=20
## 5616 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=21
## 5617 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=22
## 5618 http://ntusweety.herokuapp.com/history?&id=B22+M1020&cl=25
## 5619 http://ntusweety.herokuapp.com/history?&id=B22+M1030&cl=02
## 5620 http://ntusweety.herokuapp.com/history?&id=B22+M1030&cl=03
## 5621   http://ntusweety.herokuapp.com/history?&id=B22+U0310&cl=
## 5622   http://ntusweety.herokuapp.com/history?&id=B22+U0320&cl=
## 5623   http://ntusweety.herokuapp.com/history?&id=B22+U0380&cl=
## 5624   http://ntusweety.herokuapp.com/history?&id=B22+U0410&cl=
## 5625   http://ntusweety.herokuapp.com/history?&id=B22+U0450&cl=
## 5626   http://ntusweety.herokuapp.com/history?&id=B42+D0010&cl=
## 5627 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=04
## 5628 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=05
## 5629 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=06
## 5630 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=07
## 5631 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=11
## 5632 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=24
## 5633 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=25
## 5634 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=27
## 5635 http://ntusweety.herokuapp.com/history?&id=B42+D0020&cl=28
## 5636 http://ntusweety.herokuapp.com/history?&id=B42ED0030&cl=01
## 5637   http://ntusweety.herokuapp.com/history?&id=B42+M0010&cl=
## 5638 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=04
## 5639 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=05
## 5640 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=06
## 5641 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=07
## 5642 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=08
## 5643 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=11
## 5644 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=23
## 5645 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=24
## 5646 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=25
## 5647 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=27
## 5648 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=28
## 5649 http://ntusweety.herokuapp.com/history?&id=B42+M0020&cl=29
## 5650 http://ntusweety.herokuapp.com/history?&id=B42+M0030&cl=01
## 5651 http://ntusweety.herokuapp.com/history?&id=B42+M0030&cl=02
## 5652 http://ntusweety.herokuapp.com/history?&id=B42+M0030&cl=03
## 5653 http://ntusweety.herokuapp.com/history?&id=B42+M1500&cl=01
## 5654 http://ntusweety.herokuapp.com/history?&id=B42+M1500&cl=02
## 5655 http://ntusweety.herokuapp.com/history?&id=B42+M1500&cl=03
## 5656 http://ntusweety.herokuapp.com/history?&id=B42+M1500&cl=04
## 5657 http://ntusweety.herokuapp.com/history?&id=B42+M1500&cl=05
## 5658   http://ntusweety.herokuapp.com/history?&id=B42+U0410&cl=
## 5659   http://ntusweety.herokuapp.com/history?&id=B42+U1240&cl=
## 5660   http://ntusweety.herokuapp.com/history?&id=B42+U1300&cl=
## 5661   http://ntusweety.herokuapp.com/history?&id=B43+D0010&cl=
## 5662   http://ntusweety.herokuapp.com/history?&id=B43+D0020&cl=
## 5663 http://ntusweety.herokuapp.com/history?&id=B43+D0030&cl=03
## 5664 http://ntusweety.herokuapp.com/history?&id=B43+D0030&cl=05
## 5665 http://ntusweety.herokuapp.com/history?&id=B43+D0030&cl=08
## 5666 http://ntusweety.herokuapp.com/history?&id=B43+D0030&cl=12
## 5667 http://ntusweety.herokuapp.com/history?&id=B43+D0030&cl=13
## 5668   http://ntusweety.herokuapp.com/history?&id=B43+M0010&cl=
## 5669   http://ntusweety.herokuapp.com/history?&id=B43+M0020&cl=
## 5670 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=03
## 5671 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=05
## 5672 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=07
## 5673 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=08
## 5674 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=09
## 5675 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=10
## 5676 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=11
## 5677 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=12
## 5678 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=13
## 5679 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=15
## 5680 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=17
## 5681 http://ntusweety.herokuapp.com/history?&id=B43+M0030&cl=18
## 5682   http://ntusweety.herokuapp.com/history?&id=B43+M0300&cl=
## 5683   http://ntusweety.herokuapp.com/history?&id=B43+M0320&cl=
## 5684   http://ntusweety.herokuapp.com/history?&id=B43+M0350&cl=
## 5685   http://ntusweety.herokuapp.com/history?&id=B43+M0370&cl=
## 5686   http://ntusweety.herokuapp.com/history?&id=B43+M0432&cl=
## 5687   http://ntusweety.herokuapp.com/history?&id=B43+M0610&cl=
## 5688   http://ntusweety.herokuapp.com/history?&id=B43+M1500&cl=
## 5689   http://ntusweety.herokuapp.com/history?&id=B43+U1030&cl=
## 5690   http://ntusweety.herokuapp.com/history?&id=B43+U1080&cl=
## 5691   http://ntusweety.herokuapp.com/history?&id=B43+U1090&cl=
## 5692   http://ntusweety.herokuapp.com/history?&id=B43+U1310&cl=
## 5693   http://ntusweety.herokuapp.com/history?&id=B43+U1340&cl=
## 5694   http://ntusweety.herokuapp.com/history?&id=B43+U1350&cl=
## 5695   http://ntusweety.herokuapp.com/history?&id=B43+U1390&cl=
## 5696   http://ntusweety.herokuapp.com/history?&id=B44+D0010&cl=
## 5697 http://ntusweety.herokuapp.com/history?&id=B44+D0020&cl=01
## 5698 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=02
## 5699 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=04
## 5700 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=05
## 5701 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=06
## 5702 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=08
## 5703 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=09
## 5704 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=11
## 5705 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=13
## 5706 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=15
## 5707 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=16
## 5708 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=17
## 5709 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=19
## 5710 http://ntusweety.herokuapp.com/history?&id=B44+D0030&cl=20
## 5711   http://ntusweety.herokuapp.com/history?&id=B44+M0010&cl=
## 5712 http://ntusweety.herokuapp.com/history?&id=B44+M0020&cl=01
## 5713 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=02
## 5714 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=04
## 5715 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=05
## 5716 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=06
## 5717 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=09
## 5718 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=11
## 5719 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=13
## 5720 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=15
## 5721 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=17
## 5722 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=19
## 5723 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=20
## 5724 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=21
## 5725 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=22
## 5726 http://ntusweety.herokuapp.com/history?&id=B44+M0030&cl=23
## 5727   http://ntusweety.herokuapp.com/history?&id=B44+M0330&cl=
## 5728   http://ntusweety.herokuapp.com/history?&id=B44+U1130&cl=
## 5729   http://ntusweety.herokuapp.com/history?&id=B44+U1240&cl=
## 5730   http://ntusweety.herokuapp.com/history?&id=B44+U1440&cl=
## 5731   http://ntusweety.herokuapp.com/history?&id=B44+U1550&cl=
## 5732   http://ntusweety.herokuapp.com/history?&id=B44EU1680&cl=
## 5733   http://ntusweety.herokuapp.com/history?&id=B44+U1840&cl=
## 5734   http://ntusweety.herokuapp.com/history?&id=B44EU1920&cl=
## 5735   http://ntusweety.herokuapp.com/history?&id=B45+D0010&cl=
## 5736   http://ntusweety.herokuapp.com/history?&id=B45ED0020&cl=
## 5737   http://ntusweety.herokuapp.com/history?&id=B45+M0010&cl=
## 5738 http://ntusweety.herokuapp.com/history?&id=B45+M0020&cl=02
## 5739 http://ntusweety.herokuapp.com/history?&id=B45+M0030&cl=02
## 5740   http://ntusweety.herokuapp.com/history?&id=B45+M1130&cl=
## 5741   http://ntusweety.herokuapp.com/history?&id=B45+M1140&cl=
## 5742   http://ntusweety.herokuapp.com/history?&id=B45+M1180&cl=
## 5743   http://ntusweety.herokuapp.com/history?&id=B45+U1110&cl=
## 5744   http://ntusweety.herokuapp.com/history?&id=B45+U1170&cl=
## 5745   http://ntusweety.herokuapp.com/history?&id=B45+U1180&cl=
## 5746 http://ntusweety.herokuapp.com/history?&id=B45+U1250&cl=01
## 5747   http://ntusweety.herokuapp.com/history?&id=B45+U1310&cl=
## 5748   http://ntusweety.herokuapp.com/history?&id=B45+U1340&cl=
## 5749   http://ntusweety.herokuapp.com/history?&id=B45+U1530&cl=
## 5750   http://ntusweety.herokuapp.com/history?&id=B46+301B2&cl=
## 5751   http://ntusweety.herokuapp.com/history?&id=B46+303A2&cl=
## 5752   http://ntusweety.herokuapp.com/history?&id=B46+D0010&cl=
## 5753 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=01
## 5754 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=02
## 5755 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=03
## 5756 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=04
## 5757 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=05
## 5758 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=06
## 5759 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=07
## 5760 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=08
## 5761 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=09
## 5762 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=10
## 5763 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=11
## 5764 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=12
## 5765 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=13
## 5766 http://ntusweety.herokuapp.com/history?&id=B46+D0020&cl=14
## 5767 http://ntusweety.herokuapp.com/history?&id=B46+D0030&cl=01
## 5768 http://ntusweety.herokuapp.com/history?&id=B46+D0030&cl=02
## 5769 http://ntusweety.herokuapp.com/history?&id=B46+D0030&cl=03
## 5770 http://ntusweety.herokuapp.com/history?&id=B46+D0110&cl=01
## 5771 http://ntusweety.herokuapp.com/history?&id=B46+D0110&cl=02
## 5772 http://ntusweety.herokuapp.com/history?&id=B46ED0110&cl=03
## 5773 http://ntusweety.herokuapp.com/history?&id=B46+D0110&cl=04
## 5774 http://ntusweety.herokuapp.com/history?&id=B46+D0110&cl=05
## 5775   http://ntusweety.herokuapp.com/history?&id=B46ED0150&cl=
## 5776   http://ntusweety.herokuapp.com/history?&id=B46+D0162&cl=
## 5777   http://ntusweety.herokuapp.com/history?&id=B46ED0170&cl=
## 5778   http://ntusweety.herokuapp.com/history?&id=B46ED0220&cl=
## 5779   http://ntusweety.herokuapp.com/history?&id=B46ED0280&cl=
## 5780   http://ntusweety.herokuapp.com/history?&id=B46ED0350&cl=
## 5781   http://ntusweety.herokuapp.com/history?&id=B46+D0390&cl=
## 5782 http://ntusweety.herokuapp.com/history?&id=B46+D0410&cl=04
## 5783   http://ntusweety.herokuapp.com/history?&id=B46+M0010&cl=
## 5784 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=01
## 5785 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=02
## 5786 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=03
## 5787 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=04
## 5788 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=05
## 5789 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=06
## 5790 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=07
## 5791 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=08
## 5792 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=09
## 5793 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=10
## 5794 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=11
## 5795 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=12
## 5796 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=13
## 5797 http://ntusweety.herokuapp.com/history?&id=B46+M0020&cl=14
## 5798 http://ntusweety.herokuapp.com/history?&id=B46+M0030&cl=01
## 5799 http://ntusweety.herokuapp.com/history?&id=B46+M0030&cl=02
## 5800 http://ntusweety.herokuapp.com/history?&id=B46+M0030&cl=03
## 5801 http://ntusweety.herokuapp.com/history?&id=B46+M0040&cl=01
## 5802 http://ntusweety.herokuapp.com/history?&id=B46+M0040&cl=02
## 5803 http://ntusweety.herokuapp.com/history?&id=B46EM0040&cl=03
## 5804 http://ntusweety.herokuapp.com/history?&id=B46+M0040&cl=04
## 5805 http://ntusweety.herokuapp.com/history?&id=B46+M0040&cl=05
## 5806   http://ntusweety.herokuapp.com/history?&id=B46+M1310&cl=
## 5807   http://ntusweety.herokuapp.com/history?&id=B46+M1370&cl=
## 5808   http://ntusweety.herokuapp.com/history?&id=B46EM4450&cl=
## 5809   http://ntusweety.herokuapp.com/history?&id=B46EU0840&cl=
## 5810   http://ntusweety.herokuapp.com/history?&id=B48+D0010&cl=
## 5811   http://ntusweety.herokuapp.com/history?&id=B48+D0120&cl=
## 5812 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=01
## 5813 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=02
## 5814 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=03
## 5815 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=04
## 5816 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=05
## 5817 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=06
## 5818 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=07
## 5819 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=08
## 5820 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=09
## 5821 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=10
## 5822 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=11
## 5823 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=12
## 5824 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=13
## 5825 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=14
## 5826 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=15
## 5827 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=16
## 5828 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=17
## 5829 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=18
## 5830 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=19
## 5831 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=20
## 5832 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=21
## 5833 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=22
## 5834 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=23
## 5835 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=24
## 5836 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=25
## 5837 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=26
## 5838 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=27
## 5839 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=29
## 5840 http://ntusweety.herokuapp.com/history?&id=B48+D0210&cl=30
## 5841   http://ntusweety.herokuapp.com/history?&id=B48+D0220&cl=
## 5842   http://ntusweety.herokuapp.com/history?&id=B48+M0010&cl=
## 5843 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=01
## 5844 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=02
## 5845 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=03
## 5846 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=04
## 5847 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=05
## 5848 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=06
## 5849 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=07
## 5850 http://ntusweety.herokuapp.com/history?&id=B48+M0210&cl=08
## 5851   http://ntusweety.herokuapp.com/history?&id=B48+M0220&cl=
## 5852   http://ntusweety.herokuapp.com/history?&id=B48+U0130&cl=
## 5853   http://ntusweety.herokuapp.com/history?&id=H01+02100&cl=
## 5854   http://ntusweety.herokuapp.com/history?&id=H01+02500&cl=
## 5855   http://ntusweety.herokuapp.com/history?&id=H01+02700&cl=
## 5856   http://ntusweety.herokuapp.com/history?&id=H01+04200&cl=
## 5857   http://ntusweety.herokuapp.com/history?&id=H01E05000&cl=
## 5858   http://ntusweety.herokuapp.com/history?&id=H01+05100&cl=
## 5859   http://ntusweety.herokuapp.com/history?&id=H02+10040&cl=
## 5860   http://ntusweety.herokuapp.com/history?&id=J10+M0010&cl=
## 5861   http://ntusweety.herokuapp.com/history?&id=P01+U0010&cl=
## 5862   http://ntusweety.herokuapp.com/history?&id=P01+U0020&cl=
## 5863   http://ntusweety.herokuapp.com/history?&id=P01+U0070&cl=
## 5864   http://ntusweety.herokuapp.com/history?&id=P01+U0080&cl=
## 5865   http://ntusweety.herokuapp.com/history?&id=P01+U0090&cl=
## 5866   http://ntusweety.herokuapp.com/history?&id=P01+U0110&cl=
## 5867   http://ntusweety.herokuapp.com/history?&id=P01+U0120&cl=
## 5868   http://ntusweety.herokuapp.com/history?&id=P01+U0170&cl=
## 5869   http://ntusweety.herokuapp.com/history?&id=P01+U1610&cl=
## 5870   http://ntusweety.herokuapp.com/history?&id=P01EU1620&cl=
## 5871   http://ntusweety.herokuapp.com/history?&id=P01+U1630&cl=
## 5872   http://ntusweety.herokuapp.com/history?&id=P01+U1700&cl=
## 5873   http://ntusweety.herokuapp.com/history?&id=P01+U2170&cl=
## 5874   http://ntusweety.herokuapp.com/history?&id=P01+U2180&cl=
## 5875   http://ntusweety.herokuapp.com/history?&id=P01+U2240&cl=
## 5876   http://ntusweety.herokuapp.com/history?&id=P01+U2290&cl=
## 5877   http://ntusweety.herokuapp.com/history?&id=P01+U2360&cl=
## 5878   http://ntusweety.herokuapp.com/history?&id=P01+U2430&cl=
## 5879   http://ntusweety.herokuapp.com/history?&id=P01+U3550&cl=
## 5880   http://ntusweety.herokuapp.com/history?&id=P01+U4400&cl=
## 5881   http://ntusweety.herokuapp.com/history?&id=P01+U4410&cl=
## 5882   http://ntusweety.herokuapp.com/history?&id=P01+U4420&cl=
## 5883   http://ntusweety.herokuapp.com/history?&id=P01+U4430&cl=
## 5884   http://ntusweety.herokuapp.com/history?&id=P01+U4440&cl=
## 5885   http://ntusweety.herokuapp.com/history?&id=P01+U4450&cl=
## 5886   http://ntusweety.herokuapp.com/history?&id=P01+U4480&cl=
## 5887   http://ntusweety.herokuapp.com/history?&id=P01EU4490&cl=
## 5888   http://ntusweety.herokuapp.com/history?&id=P01+U4500&cl=
## 5889   http://ntusweety.herokuapp.com/history?&id=P01+U4510&cl=
## 5890   http://ntusweety.herokuapp.com/history?&id=P01+U4520&cl=
## 5891   http://ntusweety.herokuapp.com/history?&id=P01+U4530&cl=
## 5892   http://ntusweety.herokuapp.com/history?&id=P01+U4550&cl=
## 5893   http://ntusweety.herokuapp.com/history?&id=P01+U4570&cl=
## 5894   http://ntusweety.herokuapp.com/history?&id=P01+U6010&cl=
## 5895   http://ntusweety.herokuapp.com/history?&id=P03+U0010&cl=
## 5896   http://ntusweety.herokuapp.com/history?&id=P05+U2010&cl=
## 5897 http://ntusweety.herokuapp.com/history?&id=P05+U2020&cl=01
## 5898 http://ntusweety.herokuapp.com/history?&id=P05+U2020&cl=02
## 5899   http://ntusweety.herokuapp.com/history?&id=P05+U3230&cl=
## 5900   http://ntusweety.herokuapp.com/history?&id=P05EU4120&cl=
## 5901   http://ntusweety.herokuapp.com/history?&id=P05EU4580&cl=
## 5902 http://ntusweety.herokuapp.com/history?&id=P12+U0010&cl=01
## 5903 http://ntusweety.herokuapp.com/history?&id=P12+U0010&cl=02
## 5904   http://ntusweety.herokuapp.com/history?&id=P30+U4050&cl=
## 5905   http://ntusweety.herokuapp.com/history?&id=P35+U0100&cl=
## 5906   http://ntusweety.herokuapp.com/history?&id=P36+U0900&cl=
## 5907   http://ntusweety.herokuapp.com/history?&id=P36+U2100&cl=
## 5908   http://ntusweety.herokuapp.com/history?&id=P37+10440&cl=
## 5909   http://ntusweety.herokuapp.com/history?&id=P37+10930&cl=
## 5910   http://ntusweety.herokuapp.com/history?&id=P37+203A0&cl=
## 5911 http://ntusweety.herokuapp.com/history?&id=Q01+M0320&cl=01
## 5912 http://ntusweety.herokuapp.com/history?&id=Q01+M0330&cl=01
## 5913 http://ntusweety.herokuapp.com/history?&id=Q01+M0330&cl=03
## 5914 http://ntusweety.herokuapp.com/history?&id=Q01EM0340&cl=01
## 5915 http://ntusweety.herokuapp.com/history?&id=Q01EM0340&cl=02
## 5916 http://ntusweety.herokuapp.com/history?&id=Q01+M0500&cl=01
## 5917 http://ntusweety.herokuapp.com/history?&id=Q01+M0500&cl=02
## 5918 http://ntusweety.herokuapp.com/history?&id=Q01+M0500&cl=05
## 5919 http://ntusweety.herokuapp.com/history?&id=Q01+M0500&cl=07
## 5920 http://ntusweety.herokuapp.com/history?&id=Q01+M0500&cl=08
## 5921 http://ntusweety.herokuapp.com/history?&id=Q01+M0800&cl=01
## 5922 http://ntusweety.herokuapp.com/history?&id=Q01+M0800&cl=02

因為要做的是管院GPA和其他學院比較,資料中缺少學院資料,這裡讀取另一個檔案“college_info.txt”, 裡面有各學院名稱與簡碼資料,將檔案讀入後以left_join連結上一張表,並以“department.num”(課號)與“num”做鍵結

college.path <- "D:/R/Final/college_info.txt"
readBin(college.path, what = "raw", n = 3)
## [1] 6e 75 6d
readLines(file(college.path, encoding = "BIG5"), n = 5)
## [1] "num  Department  College" "101  中文系  文學院"     
## [3] "102  外文系  文學院"      "103  歷史系  文學院"     
## [5] "104  哲學系  文學院"
college.info <- file.info(college.path)
colnames(college.info)
## [1] "size"  "isdir" "mode"  "mtime" "ctime" "atime" "exe"
college.bin <- readBin(college.path, what = "raw", n = college.info$size)
library(stringi)
library(dplyr)
## Warning: package 'dplyr' was built under R version 3.3.3
## -------------------------------------------------------------------------
## data.table + dplyr code now lives in dtplyr.
## Please library(dtplyr)!
## -------------------------------------------------------------------------
## 
## Attaching package: 'dplyr'
## The following objects are masked from 'package:data.table':
## 
##     between, first, last
## The following objects are masked from 'package:stats':
## 
##     filter, lag
## The following objects are masked from 'package:base':
## 
##     intersect, setdiff, setequal, union
college.txt <- stri_encode(college.bin, "BIG5", "UTF-8")
college.info <- read.table(get_text_connection_by_l10n_info(college.txt), header = TRUE)
course.mix <- left_join(course,college.info,by = c("department.num" = "num"))
## Warning in left_join_impl(x, y, by$x, by$y, suffix$x, suffix$y): joining
## factors with different levels, coercing to character vector

接下來,我們先來看看各系的平均GPA #表七:系平均GPA

departmentGPA <- local({
  group_by(course.mix, Department) %>%
  summarise(GPA = mean(avgGPA)) %>%
    arrange(GPA)})
departmentGPA
## # A tibble: 55 × 2
##    Department      GPA
##        <fctr>    <dbl>
## 1      數學系 2.674815
## 2      機械系 2.975926
## 3    工科海洋 3.163333
## 4      物理系 3.207719
## 5      材料系 3.246250
## 6      大氣系 3.250769
## 7      植微系 3.280000
## 8      會計系 3.312759
## 9      心理系 3.338750
## 10     經濟系 3.340000
## # ... with 45 more rows
tail(departmentGPA)
## # A tibble: 6 × 2
##   Department      GPA
##       <fctr>    <dbl>
## 1     生技系 3.867200
## 2     電機系 3.871333
## 3     資訊系 3.902778
## 4     動科系 3.905600
## 5     圖資系 3.969667
## 6         NA      NaN

前五名平均課程GPA最高的系竟然有電機和資工,有點不合理,經訪問和看資料,發現專題課程拉高平均非常多,幾乎都是A+,而電資學院其他課程GPA都很低,為了使資料更貼近現實,統一對所有資料刪除專題研究,和有關“專題”的課程。 而GPA最低的數學、機械、物理等等不意外….辛苦這些學院了。值得注意的是,大家認為管院成績很好拿,其中的會計系平均課程給的GPA只有3.31,位於所有系倒數! #表八:扣掉專題的課程

a <- filter(course.mix, grepl(pattern = "專題", x = course, fixed = TRUE))
course.mix <- course.mix[!(course.mix$course == "專題研究"),]
course.mix <- anti_join(course.mix, a)
## Joining, by = c("class.num", "department.num", "course", "avgGPA", "prof.", "href", "Department", "College")
departmentGPA_modified <- local({
  group_by(course.mix,Department) %>%
  summarise(GPA = mean(avgGPA, na.rm = TRUE))%>%
    arrange(GPA)})
departmentGPA_modified
## # A tibble: 55 × 2
##    Department      GPA
##        <fctr>    <dbl>
## 1      數學系 2.625385
## 2      機械系 2.975926
## 3      資管系 3.069091
## 4  生物機電系 3.132105
## 5      化工系 3.162273
## 6    工科海洋 3.163333
## 7      物理系 3.207719
## 8      生工系 3.208182
## 9      材料系 3.246250
## 10     大氣系 3.250769
## # ... with 45 more rows
tail(departmentGPA_modified)
## # A tibble: 6 × 2
##   Department      GPA
##       <fctr>    <dbl>
## 1 森林環資系 3.715357
## 2     牙醫系 3.716500
## 3     職治系 3.750435
## 4     圖資系 3.782000
## 5     醫學系 3.842059
## 6     生傳系 3.853333

拿掉專題課程後的GPA,數學系依然墊底,管院中的資管系也很辛苦,倒數第三低GPA不好拿,會計系也是。 而工管和國企課程平均GPA挺高的,但也沒有到名列前茅的好拿高分。

學系比較完,我們來看看,管院究竟有沒有好拿高分? #表九:學院課程GPA比較

collegeGPA_modified <- local({
  group_by(course.mix, College) %>%
  summarise(GPA = mean(avgGPA, na.rm = TRUE))%>%
    arrange(desc(GPA))})
collegeGPA_modified
## # A tibble: 12 × 2
##       College      GPA
##        <fctr>    <dbl>
## 1      醫學院 3.713373
## 2    公衛學院 3.623125
## 3      文學院 3.594577
## 4      法學院 3.583929
## 5          NA 3.533629
## 6    生農學院 3.502996
## 7  生命科學院 3.476957
## 8      社科院 3.421818
## 9    管理學院 3.389101
## 10   電資學院 3.376410
## 11     工學院 3.314416
## 12     理學院 3.280213
dat <- local({
  group_by(course.mix, College) %>%
    summarise(GPA = mean(avgGPA, na.rm = TRUE))
})
g2 <- ggplot(dat, aes(x = College, y = GPA)) + geom_bar(stat = "identity")
g2 + coord_cartesian(ylim = c(3,3.8))
## Warning: 關閉未使用的連接 5 (D:/R/Final/college_info.txt)

並沒有!管院的成績只比電資和理工學院好拿而已!大家都是辛苦人

totalAvgGPA <- mean(departmentGPA_modified$GPA)
totalAvgGPA
## [1] 3.450751

再仔細一點,全部學院平均課程GPA是3.45,管院只有只有3.39

表十:所有學院、學系GPA視覺化比較

library(ggplot2)
g <- ggplot(course.mix, aes(x = College, y = avgGPA))
g + geom_boxplot()
## Warning: Removed 1 rows containing non-finite values (stat_boxplot).

dat2 <- local({
  group_by(course.mix, College,Department) %>%
    summarise(GPA = mean(avgGPA, na.rm = TRUE))
})
ggplot(dat2, aes(x = College, y = GPA)) + geom_point() + 
  geom_text(aes(x=College,y= GPA,label=Department))
## Warning: Removed 1 rows containing missing values (geom_text).

雖然國企、工管GPA都不錯,高於整體平均GPA,反觀其他學院,很多平均GPA和整體學院分布都比管院更好拿分數。